From de6d40adda5ddfbf7ba9286a495b58f8bf8c294e Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 25 Oct 2022 16:28:00 -0600 Subject: [PATCH 01/60] Restyle using styler::tidyverse_style() --- R/tabular_data_congruence.R | 325 +++++++++++++++++------------------- 1 file changed, 155 insertions(+), 170 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 3a618dd..71140e1 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -10,38 +10,36 @@ #' @export #' #' @examples -#' my_metadata<-load.metadata() +#' my_metadata <- load.metadata() #' -load.metadata <- function(directory = here::here()){ - #get list of all files ending in metadata.xml - lf<-list.files(path = directory, pattern="metadata.xml") +load.metadata <- function(directory = here::here()) { + # get list of all files ending in metadata.xml + lf <- list.files(path = directory, pattern = "metadata.xml") - #if metadata file exists, stop the function and warn the user - if(length(lf) < 1){ + # if metadata file exists, stop the function and warn the user + if (length(lf) < 1) { message("ERROR: Metadata check failed. No metadata found. Your metadata file name must end in _metadata.xml.\n") } - #if multiple metadata files exists, stop the function and warn the user - if(length(lf) > 1){ + # if multiple metadata files exists, stop the function and warn the user + if (length(lf) > 1) { message("ERROR: Metadata check failed. The data package format only allows one metadata file per data package. Please remove extraneous metadata files or combine them into a single file.\n") } - #if exactly 1 metadata file exists, determine what format the metadata file is. Accept only EML (for now): - if(length(lf)==1){ - if(sum(grepl("FGDC-STD-001-1998", readr::read_lines(lf)))>0){ - metaformat<-"fgdc" + # if exactly 1 metadata file exists, determine what format the metadata file is. Accept only EML (for now): + if (length(lf) == 1) { + if (sum(grepl("FGDC-STD-001-1998", readr::read_lines(lf))) > 0) { + metaformat <- "fgdc" stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) - } - else if(sum(grepl("schemas.isotc211.org/19115", readr::read_lines(lf)))>0){ - metaformat<-"ISO19915" + } else if (sum(grepl("schemas.isotc211.org/19115", readr::read_lines(lf))) > 0) { + metaformat <- "ISO19915" stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) - } - else if(sum(grepl("0){ - metaformat<-"eml" - #writeLines(paste0("\nYou are working with ", metaformat, " metadata")) - #load metadata - metadata<-EML::read_eml(lf, from="xml") - #return metadata to the the workspace - cat(paste0("PASSED: Metadata check passed. EML metadata (",crayon::blue$bold(lf),") found and loaded into R.\n\n")) + } else if (sum(grepl(" 0) { + metaformat <- "eml" + # writeLines(paste0("\nYou are working with ", metaformat, " metadata")) + # load metadata + metadata <- EML::read_eml(lf, from = "xml") + # return metadata to the the workspace + cat(paste0("PASSED: Metadata check passed. EML metadata (", crayon::blue$bold(lf), ") found and loaded into R.\n\n")) return(metadata) } } @@ -59,18 +57,18 @@ load.metadata <- function(directory = here::here()){ #' @return a tibble of .csvs #' @export #' -#' @examples my_data<-load.data() -load.data<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +#' @examples my_data <- load.data() +load.data <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - lf<-list.files(pattern=".csv") - tibble_List<-list() - for(i in lf){ - filepath<-file.path(getwd(),i) - tibble_List[[i]]<-assign(i, readr::read_csv(filepath, show_col_types=FALSE)) + lf <- list.files(pattern = ".csv") + tibble_List <- list() + for (i in lf) { + filepath <- file.path(getwd(), i) + tibble_List[[i]] <- assign(i, readr::read_csv(filepath, show_col_types = FALSE)) } return(tibble_List) } @@ -90,20 +88,20 @@ load.data<-function(directory=getwd()){ #' #' @examples #' test.metadataVersion() -test.metadataVersion<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.metadataVersion <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta<-load.metadata(directory) - if(!is.null(mymeta)){ - vers<-substr(sub(".*https://eml.ecoinformatics.org/eml-", "", mymeta)[1], 1, 5) - vers<-numeric_version(vers) - if(vers<"2.2.0"){ + mymeta <- load.metadata(directory) + if (!is.null(mymeta)) { + vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", mymeta)[1], 1, 5) + vers <- numeric_version(vers) + if (vers < "2.2.0") { message("ERROR: unsupported EML version: EML must be 2.2.0 or later.\n") } - if(vers>="2.2.0"){ + if (vers >= "2.2.0") { message("PASSED: EML version is supported.\n") } } @@ -123,21 +121,21 @@ test.metadataVersion<-function(directory=getwd()){ #' #' @examples #' test.validateSchema() -test.validateSchema<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.validateSchema <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta<-load.metadata(directory) - if(!is.null(mymeta)){ - val<-EML::eml_validate(mymeta) - if(val==TRUE){ + mymeta <- load.metadata(directory) + if (!is.null(mymeta)) { + val <- EML::eml_validate(mymeta) + if (val == TRUE) { message("PASSED: Your metada is schema valid.\n") } - if(val!=TRUE){ + if (val != TRUE) { message("ERROR: Your is metadata is schema-invalid.\n") - attribs<-attributes(val) + attribs <- attributes(val) print(attribs) } } @@ -156,18 +154,17 @@ test.validateSchema<-function(directory=getwd()){ #' #' @examples #' test.footer() -test.footer<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.footer <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta<-load.metadata(directory) - if(!is.null(mymeta)){ - if(is.null(arcticdatautils::eml_get_simple(mymeta, "numFooterLines"))==TRUE){ + mymeta <- load.metadata(directory) + if (!is.null(mymeta)) { + if (is.null(arcticdatautils::eml_get_simple(mymeta, "numFooterLines")) == TRUE) { message("Footer Check passed: Metadata indicates data files do not have footers.\n") - } - else { + } else { message("Footer Check ERROR: metadata indicates that data files include footers. Please remove all footers from data files.\n") } } @@ -187,28 +184,27 @@ test.footer<-function(directory=getwd()){ #' #' @examples #' test.headerNum() -test.headerNum<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.headerNum <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta<-load.metadata(directory) - if(!is.null(mymeta)){ - header<-arcticdatautils::eml_get_simple(mymeta, "numHeaderLines") - if(is.null(header)==TRUE){ + mymeta <- load.metadata(directory) + if (!is.null(mymeta)) { + header <- arcticdatautils::eml_get_simple(mymeta, "numHeaderLines") + if (is.null(header) == TRUE) { stop("Header Check ERROR: metadata does not contain information about number of header rows") } - headerNum<-NULL - for(i in seq_along(header)){ - if(header[i]!=1){ + headerNum <- NULL + for (i in seq_along(header)) { + if (header[i] != 1) { stop("Header Check ERROR: data files must contain exactly one header row") - } - else{ - headerNum<-append(headerNum, i) + } else { + headerNum <- append(headerNum, i) } } - if(length(headerNum)==length(headerNum)){ + if (length(headerNum) == length(headerNum)) { message("PASSED header Check: Metadata indicates that each data file contains exactly one header row") } } @@ -227,30 +223,29 @@ test.headerNum<-function(directory=getwd()){ #' #' @examples #' test.delimiter() -test.delimiter<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.delimiter <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - #load metadata - mymeta<-load.metadata(directory) + # load metadata + mymeta <- load.metadata(directory) - if(!is.null(mymeta)){ - delimit<-arcticdatautils::eml_get_simple(mymeta, "fieldDelimiter") - if(is.null(delimit)==TRUE){ + if (!is.null(mymeta)) { + delimit <- arcticdatautils::eml_get_simple(mymeta, "fieldDelimiter") + if (is.null(delimit) == TRUE) { stop("Field Delimiter Check ERROR: metadata does not contain information about the field delimiter for data files") } - delimitNum<-NULL - for(i in seq_along(delimit)){ - if(length(delimit[i])!=1){ + delimitNum <- NULL + for (i in seq_along(delimit)) { + if (length(delimit[i]) != 1) { stop("Field Delimiter Check ERROR: the field delimiter must be a single character") - } - else{ - delimitNum<-append(delimitNum, i) + } else { + delimitNum <- append(delimitNum, i) } } - if(length(delimitNum)==length(delimit)){ + if (length(delimitNum) == length(delimit)) { message("PASSED: field delimiter check passed: Metadata indicates that each data file contains a field delimiter that is a single character") } } @@ -268,31 +263,31 @@ test.delimiter<-function(directory=getwd()){ #' @export #' #' @examples test.dupMetaEntries() -test.dupMetaEntries<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.dupMetaEntries <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - #load metadata - mymeta<-load.metadata(directory) + # load metadata + mymeta <- load.metadata(directory) - if(!is.null(mymeta)){ - #get physical elements (and all children elements) - attribs<-EML::eml_get(mymeta, "physical") + if (!is.null(mymeta)) { + # get physical elements (and all children elements) + attribs <- EML::eml_get(mymeta, "physical") - #list all file names held in "objectName" - fn<-unlist(attribs)[grepl('objectName',names(unlist(attribs)), fixed=T)] + # list all file names held in "objectName" + fn <- unlist(attribs)[grepl("objectName", names(unlist(attribs)), fixed = T)] - #find duplicate entries: - dups<-fn[duplicated(fn)] + # find duplicate entries: + dups <- fn[duplicated(fn)] - #if no duplicates, test passed: - if(length(dups)==0){ + # if no duplicates, test passed: + if (length(dups) == 0) { message("PASSED: Each data file name is used exactly once in the metadata file.") } - #if duplicates, test failed: - if(length(dups>0)){ + # if duplicates, test failed: + if (length(dups > 0)) { cat(paste0("ERROR: metadata file name check failed. Some filenames are used more than once in the metadata:\n", crayon::red$bold(dups))) } } @@ -310,23 +305,23 @@ test.dupMetaEntries<-function(directory=getwd()){ #' @export #' #' @examples test.dupDataFiles() -test.dupDataFiles<-function(directory=getwd()){ - #switch directories; on exit return to current directory: +test.dupDataFiles <- function(directory = getwd()) { + # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - #get data file filenames (only .csv supported for now): - lf<-list.files(pattern=".csv") + # get data file filenames (only .csv supported for now): + lf <- list.files(pattern = ".csv") - #find duplicate entries: - dups<-lf[duplicated(lf)] - #if no duplicates, test passed: - if(length(dups)==0){ + # find duplicate entries: + dups <- lf[duplicated(lf)] + # if no duplicates, test passed: + if (length(dups) == 0) { message("PASSED: Each data file name is used exactly once.") } - #if duplicates, test failed: - if(length(dups>0)){ + # if duplicates, test failed: + if (length(dups > 0)) { print(paste0("The following data filenames are duplicated:\n", dups)) stop("ERROR: data file name check failed. Some filenames are used more than once.") } @@ -344,39 +339,39 @@ test.dupDataFiles<-function(directory=getwd()){ #' @export #' #' @examples test.fileNameMatch() -test.fileNameMatch<-function(directory=getwd()){ - #on exit return to current working directory: +test.fileNameMatch <- function(directory = getwd()) { + # on exit return to current working directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - #get metadata filenames from "physical" attribute: - mymeta<-load.metadata(directory) + # get metadata filenames from "physical" attribute: + mymeta <- load.metadata(directory) - if(!is.null(mymeta)){ - #get physical elements (and all children elements) - phys<-EML::eml_get(mymeta, "physical") + if (!is.null(mymeta)) { + # get physical elements (and all children elements) + phys <- EML::eml_get(mymeta, "physical") - #get everything under "objectName" - fn<-unlist(phys)[grepl('objectName',names(unlist(phys)), fixed=T)] + # get everything under "objectName" + fn <- unlist(phys)[grepl("objectName", names(unlist(phys)), fixed = T)] - #get filenames from .csv data files in directory: - lf<-list.files(pattern=".csv") + # get filenames from .csv data files in directory: + lf <- list.files(pattern = ".csv") - #items in metadata but not data file names: - meta<-setdiff(fn, lf) + # items in metadata but not data file names: + meta <- setdiff(fn, lf) - #items in data file names but not in metadata: - dat<-setdiff(lf, fn) + # items in data file names but not in metadata: + dat <- setdiff(lf, fn) - if(length(meta)==0 && length(dat)==0){ + if (length(meta) == 0 && length(dat) == 0) { message("PASSED: file name congruence check. All data files are listed in metadata and all metdata files names refer to data files.\n") } - if(length(meta)>0){ + if (length(meta) > 0) { message("ERROR: metadata lists file names that do not have corresponding data files:") print(crayon::red$bold(meta)) } - if(length(dat)>0){ + if (length(dat) > 0) { message("ERROR: data files exist that are not listed in the metadata:") cat(crayon::red$bold(dat)) } @@ -396,82 +391,72 @@ test.fileNameMatch<-function(directory=getwd()){ #' #' @examples #' test.fieldNum() -test.fieldNum<-function(directory=getwd()){ - #on exit return to current working directory: +test.fieldNum <- function(directory = getwd()) { + # on exit return to current working directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - #load metadata - mymeta<-load.metadata(directory) + # load metadata + mymeta <- load.metadata(directory) - if(!is.null(mymeta)){ - #get dataTable and all children elements - dataTab<-EML::eml_get(mymeta, "dataTable") - #newdat<-within(dattab, rm('@context')) + if (!is.null(mymeta)) { + # get dataTable and all children elements + dataTab <- EML::eml_get(mymeta, "dataTable") + # newdat<-within(dattab, rm('@context')) - #list the filenames associated with each dataTable: - fn<-unlist(dataTab)[grepl('objectName',names(unlist(dataTab)), fixed=T)] + # list the filenames associated with each dataTable: + fn <- unlist(dataTab)[grepl("objectName", names(unlist(dataTab)), fixed = T)] - #Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. + # Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. - #if only one dataTable: - if(length(suppressWarnings(within(dataTab[1], rm('@context'))))==0){ - attribs<-unlist(dataTab)[grepl('attributeName',names(unlist(dataTab)), fixed=T)] + # if only one dataTable: + if (length(suppressWarnings(within(dataTab[1], rm("@context")))) == 0) { + attribs <- unlist(dataTab)[grepl("attributeName", names(unlist(dataTab)), fixed = T)] assign(paste0("Meta_", fn), NULL) - for(i in seq_along(attribs)){ + for (i in seq_along(attribs)) { assign(paste0("Meta_", fn), append(get(paste0("Meta_", fn)), attribs[[i]])) } } - #if mulitple dataTables: - if(length(suppressWarnings(within(dataTab[1], rm('@context'))))>0){ - newdat<-within(dataTab, rm('@context')) - for(i in seq_along(fn)){ - attriblist<-newdat[[i]][[4]][[1]] + # if mulitple dataTables: + if (length(suppressWarnings(within(dataTab[1], rm("@context")))) > 0) { + newdat <- within(dataTab, rm("@context")) + for (i in seq_along(fn)) { + attriblist <- newdat[[i]][[4]][[1]] assign(paste0("Meta_", fn[i]), NULL) - for(j in seq_along(attriblist)){ - attribname<-newdat[[i]][[4]][[1]][[j]][[1]] + for (j in seq_along(attriblist)) { + attribname <- newdat[[i]][[4]][[1]][[j]][[1]] assign(paste0("Meta_", fn[i]), append(get(paste0("Meta_", fn[i])), attribname)) } } } - lf<-list.files(pattern=".csv") + lf <- list.files(pattern = ".csv") - #get first row of each .csv. Assumes there is exactly 1 header row! - for(i in seq_along(lf)){ + # get first row of each .csv. Assumes there is exactly 1 header row! + for (i in seq_along(lf)) { colnum <- readLines(lf[i], n = 1) assign(paste0("Data_", lf[i]), strsplit(colnum, ",")[[1]]) } - #Check each CSV. If column number and attribute number are a mismatch, add it to a list. - mismatch<-NULL - for(i in seq_along(lf)){ - #assign(paste0("files", lf[i]), NULL) - if(length(get(paste0("Data_",lf[i])))!=length(get(paste0("Meta_", lf[i])))){ - mismatch<-append(mismatch, lf[i]) + # Check each CSV. If column number and attribute number are a mismatch, add it to a list. + mismatch <- NULL + for (i in seq_along(lf)) { + # assign(paste0("files", lf[i]), NULL) + if (length(get(paste0("Data_", lf[i]))) != length(get(paste0("Meta_", lf[i])))) { + mismatch <- append(mismatch, lf[i]) } } - #if there are any mismatches, print ERROR and specify problematic files: - if(length(mismatch>0)){ + # if there are any mismatches, print ERROR and specify problematic files: + if (length(mismatch > 0)) { cat("ERROR: field numer mismatch. Some columns in data files are not listed in metadata or some attributes listed in metadata were not found as headers in the data files: \n") - cat(crayon::red$bold(mismatch), sep="\n") + cat(crayon::red$bold(mismatch), sep = "\n") } - #if there are no mismatches, print passed msg: - else{ + # if there are no mismatches, print passed msg: + else { cat("PASSED: field number match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") } } } - - - - - - - - - - From b6bf66c6b9839c29054ff19cd78a8f8e3515a6ef Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 25 Oct 2022 16:33:05 -0600 Subject: [PATCH 02/60] Remove commented code --- R/tabular_data_congruence.R | 3 --- 1 file changed, 3 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 71140e1..77c9581 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -35,7 +35,6 @@ load.metadata <- function(directory = here::here()) { stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) } else if (sum(grepl(" 0) { metaformat <- "eml" - # writeLines(paste0("\nYou are working with ", metaformat, " metadata")) # load metadata metadata <- EML::read_eml(lf, from = "xml") # return metadata to the the workspace @@ -403,7 +402,6 @@ test.fieldNum <- function(directory = getwd()) { if (!is.null(mymeta)) { # get dataTable and all children elements dataTab <- EML::eml_get(mymeta, "dataTable") - # newdat<-within(dattab, rm('@context')) # list the filenames associated with each dataTable: fn <- unlist(dataTab)[grepl("objectName", names(unlist(dataTab)), fixed = T)] @@ -443,7 +441,6 @@ test.fieldNum <- function(directory = getwd()) { # Check each CSV. If column number and attribute number are a mismatch, add it to a list. mismatch <- NULL for (i in seq_along(lf)) { - # assign(paste0("files", lf[i]), NULL) if (length(get(paste0("Data_", lf[i]))) != length(get(paste0("Meta_", lf[i])))) { mismatch <- append(mismatch, lf[i]) } From b8bc83815d821e6130b3ef65ea3962e42064c188 Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 25 Oct 2022 16:48:55 -0600 Subject: [PATCH 03/60] Change variables and fxn names to snake_case Closes #17 --- NAMESPACE | 22 ++-- R/tabular_data_congruence.R | 120 +++++++++--------- man/{load.data.Rd => load_data.Rd} | 10 +- man/{load.metadata.Rd => load_metadata.Rd} | 12 +- man/test.dupMetaEntries.Rd | 23 ---- man/test.headerNum.Rd | 23 ---- man/{test.delimiter.Rd => test_delimiter.Rd} | 12 +- ...dupDataFiles.Rd => test_dup_data_files.Rd} | 10 +- man/test_dup_meta_entries.Rd | 23 ++++ man/{test.fieldNum.Rd => test_field_num.Rd} | 10 +- ...leNameMatch.Rd => test_file_name_match.Rd} | 10 +- man/{test.footer.Rd => test_footer.Rd} | 10 +- man/test_header_num.Rd | 23 ++++ ...ataVersion.Rd => test_metadata_version.Rd} | 10 +- ...idateSchema.Rd => test_validate_schema.Rd} | 10 +- 15 files changed, 164 insertions(+), 164 deletions(-) rename man/{load.data.Rd => load_data.Rd} (81%) rename man/{load.metadata.Rd => load_metadata.Rd} (77%) delete mode 100644 man/test.dupMetaEntries.Rd delete mode 100644 man/test.headerNum.Rd rename man/{test.delimiter.Rd => test_delimiter.Rd} (76%) rename man/{test.dupDataFiles.Rd => test_dup_data_files.Rd} (70%) create mode 100644 man/test_dup_meta_entries.Rd rename man/{test.fieldNum.Rd => test_field_num.Rd} (56%) rename man/{test.fileNameMatch.Rd => test_file_name_match.Rd} (64%) rename man/{test.footer.Rd => test_footer.Rd} (81%) create mode 100644 man/test_header_num.Rd rename man/{test.metadataVersion.Rd => test_metadata_version.Rd} (64%) rename man/{test.validateSchema.Rd => test_validate_schema.Rd} (68%) diff --git a/NAMESPACE b/NAMESPACE index 81e2ef2..2f0dfdc 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,13 +1,13 @@ # Generated by roxygen2: do not edit by hand -export(load.data) -export(load.metadata) -export(test.delimiter) -export(test.dupDataFiles) -export(test.dupMetaEntries) -export(test.fieldNum) -export(test.fileNameMatch) -export(test.footer) -export(test.headerNum) -export(test.metadataVersion) -export(test.validateSchema) +export(load_data) +export(load_metadata) +export(test_delimiter) +export(test_dup_data_files) +export(test_dup_meta_entries) +export(test_field_num) +export(test_file_name_match) +export(test_footer) +export(test_header_num) +export(test_metadata_version) +export(test_validate_schema) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 77c9581..df9ca92 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -1,8 +1,8 @@ #' Load Metadata #' -#' @description load.metadata loads the metadata file from a given path or directory. +#' @description load_metadata loads the metadata file from a given path or directory. #' -#' @details given a path or directory - default is the working directory - load.metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. +#' @details given a path or directory - default is the working directory - load_metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. #' #' @param directory the directory where the metadata file is found - i.e. your data package. Defaults to your current project directory. #' @@ -10,9 +10,9 @@ #' @export #' #' @examples -#' my_metadata <- load.metadata() +#' my_metadata <- load_metadata() #' -load.metadata <- function(directory = here::here()) { +load_metadata <- function(directory = here::here()) { # get list of all files ending in metadata.xml lf <- list.files(path = directory, pattern = "metadata.xml") @@ -47,7 +47,7 @@ load.metadata <- function(directory = here::here()) { #' Load Data #' -#' @description load.data inspects the working directory for data files. Loads all existing data files into a tibble. +#' @description load_data inspects the working directory for data files. Loads all existing data files into a tibble. #' #' @details loads all data files in a specified directory (default is the working directory) into a tibble for later use in congruence checking. Returns the user to the working directory upon exit. Currently only supports .csv files. #' @@ -56,27 +56,27 @@ load.metadata <- function(directory = here::here()) { #' @return a tibble of .csvs #' @export #' -#' @examples my_data <- load.data() -load.data <- function(directory = getwd()) { +#' @examples my_data <- load_data() +load_data <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) lf <- list.files(pattern = ".csv") - tibble_List <- list() + tibble_list <- list() for (i in lf) { filepath <- file.path(getwd(), i) - tibble_List[[i]] <- assign(i, readr::read_csv(filepath, show_col_types = FALSE)) + tibble_list[[i]] <- assign(i, readr::read_csv(filepath, show_col_types = FALSE)) } - return(tibble_List) + return(tibble_list) } #' EML Version Check #' -#' @description test.metadataVersion determines whether the version of the metadata supplied meets the current criteria for an NPS data package. +#' @description test_metadata_version determines whether the version of the metadata supplied meets the current criteria for an NPS data package. #' #' @details currently only EML is supported. EML must be version >= 2.2.0. #' @@ -86,14 +86,14 @@ load.data <- function(directory = getwd()) { #' @export #' #' @examples -#' test.metadataVersion() -test.metadataVersion <- function(directory = getwd()) { +#' test_metadata_version() +test_metadata_version <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", mymeta)[1], 1, 5) vers <- numeric_version(vers) @@ -109,7 +109,7 @@ test.metadataVersion <- function(directory = getwd()) { #' Validate Metadata Schema #' -#' @description test.validateSchema inspects a metadata object loaded into R and determines whether it is schema-valid. +#' @description test_validate_schema inspects a metadata object loaded into R and determines whether it is schema-valid. #' #' @details currently, only EML is supported. For now this is just a wrapper form EML::eml_validate(). #' @@ -119,14 +119,14 @@ test.metadataVersion <- function(directory = getwd()) { #' @export #' #' @examples -#' test.validateSchema() -test.validateSchema <- function(directory = getwd()) { +#' test_validate_schema() +test_validate_schema <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { val <- EML::eml_validate(mymeta) if (val == TRUE) { @@ -142,7 +142,7 @@ test.validateSchema <- function(directory = getwd()) { #' Footer Check #' -#' @description test.footer checks the metadata files to determine whether data files contain footer lines or not. +#' @description test_footer checks the metadata files to determine whether data files contain footer lines or not. #' #' @details If footer lines are not present, the data package passes the test. If footer lines are present, the data package fails the test and the user is instructed to remove footer lines prior to data package upload. Currently only EML metadata are supported. #' @@ -152,14 +152,14 @@ test.validateSchema <- function(directory = getwd()) { #' @export #' #' @examples -#' test.footer() -test.footer <- function(directory = getwd()) { +#' test_footer() +test_footer <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { if (is.null(arcticdatautils::eml_get_simple(mymeta, "numFooterLines")) == TRUE) { message("Footer Check passed: Metadata indicates data files do not have footers.\n") @@ -172,9 +172,9 @@ test.footer <- function(directory = getwd()) { #' Header Check #' -#' @description test.headerNum checks the metadata files to ensure that each data file contains exactly one header row. +#' @description test_header_num checks the metadata files to ensure that each data file contains exactly one header row. #' -#' @details headerCheck examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. +#' @details test_header_num examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. #' #' @param directory the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory. #' @@ -182,28 +182,28 @@ test.footer <- function(directory = getwd()) { #' @export #' #' @examples -#' test.headerNum() -test.headerNum <- function(directory = getwd()) { +#' test_header_num() +test_header_num <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { header <- arcticdatautils::eml_get_simple(mymeta, "numHeaderLines") if (is.null(header) == TRUE) { stop("Header Check ERROR: metadata does not contain information about number of header rows") } - headerNum <- NULL + header_num <- NULL for (i in seq_along(header)) { if (header[i] != 1) { stop("Header Check ERROR: data files must contain exactly one header row") } else { - headerNum <- append(headerNum, i) + header_num <- append(header_num, i) } } - if (length(headerNum) == length(headerNum)) { + if (length(header_num) == length(header_num)) { message("PASSED header Check: Metadata indicates that each data file contains exactly one header row") } } @@ -211,9 +211,9 @@ test.headerNum <- function(directory = getwd()) { #' Field Delimiter Check #' -#' @description test.delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). +#' @description test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). #' -#' @details test.delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. +#' @details test_delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. #' #' @param directory the directory where the metadata file is found - i.e. your data package. Defaults to the current working directory. On exit, returns you to the current working directory. #' @@ -221,30 +221,30 @@ test.headerNum <- function(directory = getwd()) { #' @export #' #' @examples -#' test.delimiter() -test.delimiter <- function(directory = getwd()) { +#' test_delimiter() +test_delimiter <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) # load metadata - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { delimit <- arcticdatautils::eml_get_simple(mymeta, "fieldDelimiter") if (is.null(delimit) == TRUE) { stop("Field Delimiter Check ERROR: metadata does not contain information about the field delimiter for data files") } - delimitNum <- NULL + delimit_num <- NULL for (i in seq_along(delimit)) { if (length(delimit[i]) != 1) { stop("Field Delimiter Check ERROR: the field delimiter must be a single character") } else { - delimitNum <- append(delimitNum, i) + delimit_num <- append(delimit_num, i) } } - if (length(delimitNum) == length(delimit)) { + if (length(delimit_num) == length(delimit)) { message("PASSED: field delimiter check passed: Metadata indicates that each data file contains a field delimiter that is a single character") } } @@ -252,24 +252,24 @@ test.delimiter <- function(directory = getwd()) { #' Test Metadata for Duplicate Filenames #' -#' @description test.dupMetaEntries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. +#' @description test_dup_meta_entries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. #' -#' @details specifically, test.dupMetaEntries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. +#' @details specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. #' #' @param directory the directory where the files for your data package reside. Defaults to the current working directory. #' #' @return message #' @export #' -#' @examples test.dupMetaEntries() -test.dupMetaEntries <- function(directory = getwd()) { +#' @examples test_dup_meta_entries() +test_dup_meta_entries <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) # load metadata - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { # get physical elements (and all children elements) @@ -294,7 +294,7 @@ test.dupMetaEntries <- function(directory = getwd()) { #' Test Data Files for Duplicate Names #' -#' @description test.dupDataFiles looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. +#' @description test_dup_data_files looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. #' #' @details not sure why you'd ever need this function. Seems that most file systems won't let you have duplicate file names, but here it is for the sake of completeness. If you specify a directory other than your current working directory, it will return to the current working directory on exit. #' @@ -303,8 +303,8 @@ test.dupMetaEntries <- function(directory = getwd()) { #' @return message #' @export #' -#' @examples test.dupDataFiles() -test.dupDataFiles <- function(directory = getwd()) { +#' @examples test_dup_data_files() +test_dup_data_files <- function(directory = getwd()) { # switch directories; on exit return to current directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) @@ -328,7 +328,7 @@ test.dupDataFiles <- function(directory = getwd()) { #' File Name Match #' -#' @description test.fileNameMatch checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. +#' @description test_file_name_match checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. #' #' @details If a directory other than the current working directory is specified, test.fileNameMatch returns to the current working directory on exit. Note that the metadata file must follow NPS naming conventions, specifically ending in *_metadata.xml. test.fileNameMatch assumes there are the same number of data files in the directory as dataTables in the metadata file. #' @@ -337,15 +337,15 @@ test.dupDataFiles <- function(directory = getwd()) { #' @return text #' @export #' -#' @examples test.fileNameMatch() -test.fileNameMatch <- function(directory = getwd()) { +#' @examples test_file_name_match() +test_file_name_match <- function(directory = getwd()) { # on exit return to current working directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) # get metadata filenames from "physical" attribute: - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { # get physical elements (and all children elements) @@ -379,7 +379,7 @@ test.fileNameMatch <- function(directory = getwd()) { #' Test Number of Fields #' -#' @description test.filedNum compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. +#' @description test_field_num compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. #' #' @details One thing to be cautious of: test.fieldNum does not compare the order or names of the columns! For now, that's on you. #' @@ -389,28 +389,28 @@ test.fileNameMatch <- function(directory = getwd()) { #' @export #' #' @examples -#' test.fieldNum() -test.fieldNum <- function(directory = getwd()) { +#' test_field_num() +test_field_num <- function(directory = getwd()) { # on exit return to current working directory: orig_wd <- getwd() on.exit(setwd(orig_wd)) setwd(directory) # load metadata - mymeta <- load.metadata(directory) + mymeta <- load_metadata(directory) if (!is.null(mymeta)) { # get dataTable and all children elements - dataTab <- EML::eml_get(mymeta, "dataTable") + data_tbl <- EML::eml_get(mymeta, "dataTable") # list the filenames associated with each dataTable: - fn <- unlist(dataTab)[grepl("objectName", names(unlist(dataTab)), fixed = T)] + fn <- unlist(data_tbl)[grepl("objectName", names(unlist(data_tbl)), fixed = T)] # Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. # if only one dataTable: - if (length(suppressWarnings(within(dataTab[1], rm("@context")))) == 0) { - attribs <- unlist(dataTab)[grepl("attributeName", names(unlist(dataTab)), fixed = T)] + if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) == 0) { + attribs <- unlist(data_tbl)[grepl("attributeName", names(unlist(data_tbl)), fixed = T)] assign(paste0("Meta_", fn), NULL) for (i in seq_along(attribs)) { assign(paste0("Meta_", fn), append(get(paste0("Meta_", fn)), attribs[[i]])) @@ -418,8 +418,8 @@ test.fieldNum <- function(directory = getwd()) { } # if mulitple dataTables: - if (length(suppressWarnings(within(dataTab[1], rm("@context")))) > 0) { - newdat <- within(dataTab, rm("@context")) + if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) > 0) { + newdat <- within(data_tbl, rm("@context")) for (i in seq_along(fn)) { attriblist <- newdat[[i]][[4]][[1]] assign(paste0("Meta_", fn[i]), NULL) diff --git a/man/load.data.Rd b/man/load_data.Rd similarity index 81% rename from man/load.data.Rd rename to man/load_data.Rd index 467df2d..b610135 100644 --- a/man/load.data.Rd +++ b/man/load_data.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{load.data} -\alias{load.data} +\name{load_data} +\alias{load_data} \title{Load Data} \usage{ -load.data(directory = getwd()) +load_data(directory = getwd()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} @@ -13,11 +13,11 @@ load.data(directory = getwd()) a tibble of .csvs } \description{ -load.data inspects the working directory for data files. Loads all existing data files into a tibble. +load_data inspects the working directory for data files. Loads all existing data files into a tibble. } \details{ loads all data files in a specified directory (default is the working directory) into a tibble for later use in congruence checking. Returns the user to the working directory upon exit. Currently only supports .csv files. } \examples{ -my_data<-load.data() +my_data <- load_data() } diff --git a/man/load.metadata.Rd b/man/load_metadata.Rd similarity index 77% rename from man/load.metadata.Rd rename to man/load_metadata.Rd index 2cddcfb..e68b32b 100644 --- a/man/load.metadata.Rd +++ b/man/load_metadata.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{load.metadata} -\alias{load.metadata} +\name{load_metadata} +\alias{load_metadata} \title{Load Metadata} \usage{ -load.metadata(directory = here::here()) +load_metadata(directory = here::here()) } \arguments{ \item{directory}{the directory where the metadata file is found - i.e. your data package. Defaults to your current project directory.} @@ -13,12 +13,12 @@ load.metadata(directory = here::here()) an R-object formatted as EML metadata. } \description{ -load.metadata loads the metadata file from a given path or directory. +load_metadata loads the metadata file from a given path or directory. } \details{ -given a path or directory - default is the working directory - load.metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. +given a path or directory - default is the working directory - load_metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. } \examples{ -my_metadata<-load.metadata() +my_metadata <- load_metadata() } diff --git a/man/test.dupMetaEntries.Rd b/man/test.dupMetaEntries.Rd deleted file mode 100644 index 0ad7b2b..0000000 --- a/man/test.dupMetaEntries.Rd +++ /dev/null @@ -1,23 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/tabular_data_congruence.R -\name{test.dupMetaEntries} -\alias{test.dupMetaEntries} -\title{Test Metadata for Duplicate Filenames} -\usage{ -test.dupMetaEntries(directory = getwd()) -} -\arguments{ -\item{directory}{the directory where the files for your data package reside. Defaults to the current working directory.} -} -\value{ -message -} -\description{ -test.dupMetaEntries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. -} -\details{ -specifically, test.dupMetaEntries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. -} -\examples{ -test.dupMetaEntries() -} diff --git a/man/test.headerNum.Rd b/man/test.headerNum.Rd deleted file mode 100644 index ddef954..0000000 --- a/man/test.headerNum.Rd +++ /dev/null @@ -1,23 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/tabular_data_congruence.R -\name{test.headerNum} -\alias{test.headerNum} -\title{Header Check} -\usage{ -test.headerNum(directory = getwd()) -} -\arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} -} -\value{ -message -} -\description{ -test.headerNum checks the metadata files to ensure that each data file contains exactly one header row. -} -\details{ -headerCheck examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. -} -\examples{ -test.headerNum() -} diff --git a/man/test.delimiter.Rd b/man/test_delimiter.Rd similarity index 76% rename from man/test.delimiter.Rd rename to man/test_delimiter.Rd index 4023293..001199b 100644 --- a/man/test.delimiter.Rd +++ b/man/test_delimiter.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.delimiter} -\alias{test.delimiter} +\name{test_delimiter} +\alias{test_delimiter} \title{Field Delimiter Check} \usage{ -test.delimiter(directory = getwd()) +test_delimiter(directory = getwd()) } \arguments{ \item{directory}{the directory where the metadata file is found - i.e. your data package. Defaults to the current working directory. On exit, returns you to the current working directory.} @@ -13,11 +13,11 @@ test.delimiter(directory = getwd()) message } \description{ -test.delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). +test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). } \details{ -test.delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. +test_delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. } \examples{ -test.delimiter() +test_delimiter() } diff --git a/man/test.dupDataFiles.Rd b/man/test_dup_data_files.Rd similarity index 70% rename from man/test.dupDataFiles.Rd rename to man/test_dup_data_files.Rd index 34db865..71efc86 100644 --- a/man/test.dupDataFiles.Rd +++ b/man/test_dup_data_files.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.dupDataFiles} -\alias{test.dupDataFiles} +\name{test_dup_data_files} +\alias{test_dup_data_files} \title{Test Data Files for Duplicate Names} \usage{ -test.dupDataFiles(directory = getwd()) +test_dup_data_files(directory = getwd()) } \arguments{ \item{directory}{path to your data files. Defaults to the current working directory.} @@ -13,11 +13,11 @@ test.dupDataFiles(directory = getwd()) message } \description{ -test.dupDataFiles looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. +test_dup_data_files looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. } \details{ not sure why you'd ever need this function. Seems that most file systems won't let you have duplicate file names, but here it is for the sake of completeness. If you specify a directory other than your current working directory, it will return to the current working directory on exit. } \examples{ -test.dupDataFiles() +test_dup_data_files() } diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd new file mode 100644 index 0000000..748c848 --- /dev/null +++ b/man/test_dup_meta_entries.Rd @@ -0,0 +1,23 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{test_dup_meta_entries} +\alias{test_dup_meta_entries} +\title{Test Metadata for Duplicate Filenames} +\usage{ +test_dup_meta_entries(directory = getwd()) +} +\arguments{ +\item{directory}{the directory where the files for your data package reside. Defaults to the current working directory.} +} +\value{ +message +} +\description{ +test_dup_meta_entries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. +} +\details{ +specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. +} +\examples{ +test_dup_meta_entries() +} diff --git a/man/test.fieldNum.Rd b/man/test_field_num.Rd similarity index 56% rename from man/test.fieldNum.Rd rename to man/test_field_num.Rd index 3958027..04a67a8 100644 --- a/man/test.fieldNum.Rd +++ b/man/test_field_num.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.fieldNum} -\alias{test.fieldNum} +\name{test_field_num} +\alias{test_field_num} \title{Test Number of Fields} \usage{ -test.fieldNum(directory = getwd()) +test_field_num(directory = getwd()) } \arguments{ \item{directory}{path to the data package files. Defaults to the current working directory.} @@ -13,11 +13,11 @@ test.fieldNum(directory = getwd()) message } \description{ -test.filedNum compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. +test_field_num compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. } \details{ One thing to be cautious of: test.fieldNum does not compare the order or names of the columns! For now, that's on you. } \examples{ -test.fieldNum() +test_field_num() } diff --git a/man/test.fileNameMatch.Rd b/man/test_file_name_match.Rd similarity index 64% rename from man/test.fileNameMatch.Rd rename to man/test_file_name_match.Rd index 163ed55..4961649 100644 --- a/man/test.fileNameMatch.Rd +++ b/man/test_file_name_match.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.fileNameMatch} -\alias{test.fileNameMatch} +\name{test_file_name_match} +\alias{test_file_name_match} \title{File Name Match} \usage{ -test.fileNameMatch(directory = getwd()) +test_file_name_match(directory = getwd()) } \arguments{ \item{directory}{path to the data files and metadata of a data package. Defaults to the current working directory.} @@ -13,11 +13,11 @@ test.fileNameMatch(directory = getwd()) text } \description{ -test.fileNameMatch checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. +test_file_name_match checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. } \details{ If a directory other than the current working directory is specified, test.fileNameMatch returns to the current working directory on exit. Note that the metadata file must follow NPS naming conventions, specifically ending in *_metadata.xml. test.fileNameMatch assumes there are the same number of data files in the directory as dataTables in the metadata file. } \examples{ -test.fileNameMatch() +test_file_name_match() } diff --git a/man/test.footer.Rd b/man/test_footer.Rd similarity index 81% rename from man/test.footer.Rd rename to man/test_footer.Rd index 2b07b5d..be12276 100644 --- a/man/test.footer.Rd +++ b/man/test_footer.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.footer} -\alias{test.footer} +\name{test_footer} +\alias{test_footer} \title{Footer Check} \usage{ -test.footer(directory = getwd()) +test_footer(directory = getwd()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} @@ -13,11 +13,11 @@ test.footer(directory = getwd()) message } \description{ -test.footer checks the metadata files to determine whether data files contain footer lines or not. +test_footer checks the metadata files to determine whether data files contain footer lines or not. } \details{ If footer lines are not present, the data package passes the test. If footer lines are present, the data package fails the test and the user is instructed to remove footer lines prior to data package upload. Currently only EML metadata are supported. } \examples{ -test.footer() +test_footer() } diff --git a/man/test_header_num.Rd b/man/test_header_num.Rd new file mode 100644 index 0000000..6ae9fdf --- /dev/null +++ b/man/test_header_num.Rd @@ -0,0 +1,23 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{test_header_num} +\alias{test_header_num} +\title{Header Check} +\usage{ +test_header_num(directory = getwd()) +} +\arguments{ +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} +} +\value{ +message +} +\description{ +test_header_num checks the metadata files to ensure that each data file contains exactly one header row. +} +\details{ +test_header_num examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. +} +\examples{ +test_header_num() +} diff --git a/man/test.metadataVersion.Rd b/man/test_metadata_version.Rd similarity index 64% rename from man/test.metadataVersion.Rd rename to man/test_metadata_version.Rd index caf81fb..88c07df 100644 --- a/man/test.metadataVersion.Rd +++ b/man/test_metadata_version.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.metadataVersion} -\alias{test.metadataVersion} +\name{test_metadata_version} +\alias{test_metadata_version} \title{EML Version Check} \usage{ -test.metadataVersion(directory = getwd()) +test_metadata_version(directory = getwd()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} @@ -13,11 +13,11 @@ test.metadataVersion(directory = getwd()) message } \description{ -test.metadataVersion determines whether the version of the metadata supplied meets the current criteria for an NPS data package. +test_metadata_version determines whether the version of the metadata supplied meets the current criteria for an NPS data package. } \details{ currently only EML is supported. EML must be version >= 2.2.0. } \examples{ -test.metadataVersion() +test_metadata_version() } diff --git a/man/test.validateSchema.Rd b/man/test_validate_schema.Rd similarity index 68% rename from man/test.validateSchema.Rd rename to man/test_validate_schema.Rd index 615cad7..e196545 100644 --- a/man/test.validateSchema.Rd +++ b/man/test_validate_schema.Rd @@ -1,10 +1,10 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/tabular_data_congruence.R -\name{test.validateSchema} -\alias{test.validateSchema} +\name{test_validate_schema} +\alias{test_validate_schema} \title{Validate Metadata Schema} \usage{ -test.validateSchema(directory = getwd()) +test_validate_schema(directory = getwd()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} @@ -13,11 +13,11 @@ test.validateSchema(directory = getwd()) message } \description{ -test.validateSchema inspects a metadata object loaded into R and determines whether it is schema-valid. +test_validate_schema inspects a metadata object loaded into R and determines whether it is schema-valid. } \details{ currently, only EML is supported. For now this is just a wrapper form EML::eml_validate(). } \examples{ -test.validateSchema() +test_validate_schema() } From 780d97842b6966c8478e0118e0b3ac818e9838fe Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 25 Oct 2022 17:10:28 -0600 Subject: [PATCH 04/60] Eliminate use of getwd Closes #9 --- R/tabular_data_congruence.R | 78 +++++++----------------------------- man/load_data.Rd | 2 +- man/test_delimiter.Rd | 2 +- man/test_dup_data_files.Rd | 2 +- man/test_dup_meta_entries.Rd | 2 +- man/test_field_num.Rd | 2 +- man/test_file_name_match.Rd | 2 +- man/test_footer.Rd | 2 +- man/test_header_num.Rd | 2 +- man/test_metadata_version.Rd | 2 +- man/test_validate_schema.Rd | 2 +- 11 files changed, 24 insertions(+), 74 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index df9ca92..ac027fa 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -57,16 +57,11 @@ load_metadata <- function(directory = here::here()) { #' @export #' #' @examples my_data <- load_data() -load_data <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +load_data <- function(directory = here::here()) { lf <- list.files(pattern = ".csv") tibble_list <- list() for (i in lf) { - filepath <- file.path(getwd(), i) + filepath <- file.path(directory, i) tibble_list[[i]] <- assign(i, readr::read_csv(filepath, show_col_types = FALSE)) } return(tibble_list) @@ -87,12 +82,7 @@ load_data <- function(directory = getwd()) { #' #' @examples #' test_metadata_version() -test_metadata_version <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_metadata_version <- function(directory = here::here()) { mymeta <- load_metadata(directory) if (!is.null(mymeta)) { vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", mymeta)[1], 1, 5) @@ -120,12 +110,7 @@ test_metadata_version <- function(directory = getwd()) { #' #' @examples #' test_validate_schema() -test_validate_schema <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_validate_schema <- function(directory = here::here()) { mymeta <- load_metadata(directory) if (!is.null(mymeta)) { val <- EML::eml_validate(mymeta) @@ -153,12 +138,7 @@ test_validate_schema <- function(directory = getwd()) { #' #' @examples #' test_footer() -test_footer <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_footer <- function(directory = here::here()) { mymeta <- load_metadata(directory) if (!is.null(mymeta)) { if (is.null(arcticdatautils::eml_get_simple(mymeta, "numFooterLines")) == TRUE) { @@ -183,12 +163,7 @@ test_footer <- function(directory = getwd()) { #' #' @examples #' test_header_num() -test_header_num <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_header_num <- function(directory = here::here()) { mymeta <- load_metadata(directory) if (!is.null(mymeta)) { header <- arcticdatautils::eml_get_simple(mymeta, "numHeaderLines") @@ -222,12 +197,7 @@ test_header_num <- function(directory = getwd()) { #' #' @examples #' test_delimiter() -test_delimiter <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_delimiter <- function(directory = here::here()) { # load metadata mymeta <- load_metadata(directory) @@ -262,12 +232,7 @@ test_delimiter <- function(directory = getwd()) { #' @export #' #' @examples test_dup_meta_entries() -test_dup_meta_entries <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_dup_meta_entries <- function(directory = here::here()) { # load metadata mymeta <- load_metadata(directory) @@ -304,14 +269,9 @@ test_dup_meta_entries <- function(directory = getwd()) { #' @export #' #' @examples test_dup_data_files() -test_dup_data_files <- function(directory = getwd()) { - # switch directories; on exit return to current directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_dup_data_files <- function(directory = here::here()) { # get data file filenames (only .csv supported for now): - lf <- list.files(pattern = ".csv") + lf <- list.files(path = directory, pattern = ".csv") # find duplicate entries: dups <- lf[duplicated(lf)] @@ -338,12 +298,7 @@ test_dup_data_files <- function(directory = getwd()) { #' @export #' #' @examples test_file_name_match() -test_file_name_match <- function(directory = getwd()) { - # on exit return to current working directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_file_name_match <- function(directory = here::here()) { # get metadata filenames from "physical" attribute: mymeta <- load_metadata(directory) @@ -355,7 +310,7 @@ test_file_name_match <- function(directory = getwd()) { fn <- unlist(phys)[grepl("objectName", names(unlist(phys)), fixed = T)] # get filenames from .csv data files in directory: - lf <- list.files(pattern = ".csv") + lf <- list.files(path = directory, pattern = ".csv") # items in metadata but not data file names: meta <- setdiff(fn, lf) @@ -390,12 +345,7 @@ test_file_name_match <- function(directory = getwd()) { #' #' @examples #' test_field_num() -test_field_num <- function(directory = getwd()) { - # on exit return to current working directory: - orig_wd <- getwd() - on.exit(setwd(orig_wd)) - setwd(directory) - +test_field_num <- function(directory = here::here()) { # load metadata mymeta <- load_metadata(directory) @@ -430,7 +380,7 @@ test_field_num <- function(directory = getwd()) { } } - lf <- list.files(pattern = ".csv") + lf <- list.files(path = directory, pattern = ".csv") # get first row of each .csv. Assumes there is exactly 1 header row! for (i in seq_along(lf)) { diff --git a/man/load_data.Rd b/man/load_data.Rd index b610135..347cf7c 100644 --- a/man/load_data.Rd +++ b/man/load_data.Rd @@ -4,7 +4,7 @@ \alias{load_data} \title{Load Data} \usage{ -load_data(directory = getwd()) +load_data(directory = here::here()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} diff --git a/man/test_delimiter.Rd b/man/test_delimiter.Rd index 001199b..33670e2 100644 --- a/man/test_delimiter.Rd +++ b/man/test_delimiter.Rd @@ -4,7 +4,7 @@ \alias{test_delimiter} \title{Field Delimiter Check} \usage{ -test_delimiter(directory = getwd()) +test_delimiter(directory = here::here()) } \arguments{ \item{directory}{the directory where the metadata file is found - i.e. your data package. Defaults to the current working directory. On exit, returns you to the current working directory.} diff --git a/man/test_dup_data_files.Rd b/man/test_dup_data_files.Rd index 71efc86..d125a03 100644 --- a/man/test_dup_data_files.Rd +++ b/man/test_dup_data_files.Rd @@ -4,7 +4,7 @@ \alias{test_dup_data_files} \title{Test Data Files for Duplicate Names} \usage{ -test_dup_data_files(directory = getwd()) +test_dup_data_files(directory = here::here()) } \arguments{ \item{directory}{path to your data files. Defaults to the current working directory.} diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd index 748c848..4d7c978 100644 --- a/man/test_dup_meta_entries.Rd +++ b/man/test_dup_meta_entries.Rd @@ -4,7 +4,7 @@ \alias{test_dup_meta_entries} \title{Test Metadata for Duplicate Filenames} \usage{ -test_dup_meta_entries(directory = getwd()) +test_dup_meta_entries(directory = here::here()) } \arguments{ \item{directory}{the directory where the files for your data package reside. Defaults to the current working directory.} diff --git a/man/test_field_num.Rd b/man/test_field_num.Rd index 04a67a8..8f0e0f7 100644 --- a/man/test_field_num.Rd +++ b/man/test_field_num.Rd @@ -4,7 +4,7 @@ \alias{test_field_num} \title{Test Number of Fields} \usage{ -test_field_num(directory = getwd()) +test_field_num(directory = here::here()) } \arguments{ \item{directory}{path to the data package files. Defaults to the current working directory.} diff --git a/man/test_file_name_match.Rd b/man/test_file_name_match.Rd index 4961649..dd9167b 100644 --- a/man/test_file_name_match.Rd +++ b/man/test_file_name_match.Rd @@ -4,7 +4,7 @@ \alias{test_file_name_match} \title{File Name Match} \usage{ -test_file_name_match(directory = getwd()) +test_file_name_match(directory = here::here()) } \arguments{ \item{directory}{path to the data files and metadata of a data package. Defaults to the current working directory.} diff --git a/man/test_footer.Rd b/man/test_footer.Rd index be12276..e312c90 100644 --- a/man/test_footer.Rd +++ b/man/test_footer.Rd @@ -4,7 +4,7 @@ \alias{test_footer} \title{Footer Check} \usage{ -test_footer(directory = getwd()) +test_footer(directory = here::here()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} diff --git a/man/test_header_num.Rd b/man/test_header_num.Rd index 6ae9fdf..06b5b45 100644 --- a/man/test_header_num.Rd +++ b/man/test_header_num.Rd @@ -4,7 +4,7 @@ \alias{test_header_num} \title{Header Check} \usage{ -test_header_num(directory = getwd()) +test_header_num(directory = here::here()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} diff --git a/man/test_metadata_version.Rd b/man/test_metadata_version.Rd index 88c07df..70ea11c 100644 --- a/man/test_metadata_version.Rd +++ b/man/test_metadata_version.Rd @@ -4,7 +4,7 @@ \alias{test_metadata_version} \title{EML Version Check} \usage{ -test_metadata_version(directory = getwd()) +test_metadata_version(directory = here::here()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} diff --git a/man/test_validate_schema.Rd b/man/test_validate_schema.Rd index e196545..281cc15 100644 --- a/man/test_validate_schema.Rd +++ b/man/test_validate_schema.Rd @@ -4,7 +4,7 @@ \alias{test_validate_schema} \title{Validate Metadata Schema} \usage{ -test_validate_schema(directory = getwd()) +test_validate_schema(directory = here::here()) } \arguments{ \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} From d90f1fcd363b006a3bb8e21a857858f0e7313556 Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 25 Oct 2022 17:54:54 -0600 Subject: [PATCH 05/60] Refactor load_data Closes #11 --- R/tabular_data_congruence.R | 11 +++++------ 1 file changed, 5 insertions(+), 6 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index ac027fa..f41fd9f 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -58,12 +58,11 @@ load_metadata <- function(directory = here::here()) { #' #' @examples my_data <- load_data() load_data <- function(directory = here::here()) { - lf <- list.files(pattern = ".csv") - tibble_list <- list() - for (i in lf) { - filepath <- file.path(directory, i) - tibble_list[[i]] <- assign(i, readr::read_csv(filepath, show_col_types = FALSE)) - } + data_filenames <- list.files(path = directory, pattern = ".csv") + tibble_list <- sapply(data_filenames, + function(data_file) {readr::read_csv(file.path(directory, data_file), show_col_types = FALSE)}, + USE.NAMES = TRUE, + simplify = FALSE) return(tibble_list) } From bef93d866e9bf85684c521477317529f5551e89e Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 26 Oct 2022 16:15:06 -0600 Subject: [PATCH 06/60] Allll the refactoring Made errors and return values more consistent, updated roxygen documentation to remove redundancy. test_field_num is half done and broken, will fix soon --- R/tabular_data_congruence.R | 404 +++++++++++++++++------------------ man/test_delimiter.Rd | 6 +- man/test_dup_data_files.Rd | 3 +- man/test_dup_meta_entries.Rd | 4 +- man/test_field_num.Rd | 6 +- man/test_file_name_match.Rd | 9 +- man/test_footer.Rd | 4 +- man/test_header_num.Rd | 4 +- man/test_metadata_version.Rd | 4 +- man/test_validate_schema.Rd | 4 +- 10 files changed, 222 insertions(+), 226 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index f41fd9f..e71b218 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -15,33 +15,36 @@ load_metadata <- function(directory = here::here()) { # get list of all files ending in metadata.xml lf <- list.files(path = directory, pattern = "metadata.xml") - - # if metadata file exists, stop the function and warn the user - if (length(lf) < 1) { - message("ERROR: Metadata check failed. No metadata found. Your metadata file name must end in _metadata.xml.\n") - } - # if multiple metadata files exists, stop the function and warn the user - if (length(lf) > 1) { - message("ERROR: Metadata check failed. The data package format only allows one metadata file per data package. Please remove extraneous metadata files or combine them into a single file.\n") - } + metadata_file <- file.path(directory, lf) # if exactly 1 metadata file exists, determine what format the metadata file is. Accept only EML (for now): - if (length(lf) == 1) { - if (sum(grepl("FGDC-STD-001-1998", readr::read_lines(lf))) > 0) { - metaformat <- "fgdc" + if (length(metadata_file) == 1) { + # Determine metadata format + metaformat <- dplyr::case_when(any(grepl("FGDC-STD-001-1998", readr::read_lines(metadata_file))) ~ "fgdc", + any(grepl("schemas.isotc211.org/19115", readr::read_lines(metadata_file))) ~ "ISO19915", + any(grepl(" 0) { - metaformat <- "ISO19915" + } else if (metaformat == "ISO19915") { stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) - } else if (sum(grepl(" 0) { - metaformat <- "eml" - # load metadata - metadata <- EML::read_eml(lf, from = "xml") - # return metadata to the the workspace - cat(paste0("PASSED: Metadata check passed. EML metadata (", crayon::blue$bold(lf), ") found and loaded into R.\n\n")) - return(metadata) + } else if (metaformat == "eml") { + metadata <- EML::read_eml(metadata_file, from = "xml") + if (is.null(metadata)) { + stop("Could not load metadata.") + } else { + message(paste0("PASSED: Metadata check passed. EML metadata (", crayon::blue$bold(metadata_file), ") found and loaded into R.")) + } + } + } else if (length(metadata_file) < 1) { # if no metadata file exists, stop the function and warn the user + stop("Metadata check failed. No metadata found. Your metadata file name must end in _metadata.xml.\n") + } else if (length(metadata_file) > 1) { # if multiple metadata files exist, stop the function and warn the user + stop("Metadata check failed. The data package format only allows one metadata file per data package. Please remove extraneous metadata files or combine them into a single file.\n") } + + return(metadata) } @@ -74,25 +77,24 @@ load_data <- function(directory = here::here()) { #' #' @details currently only EML is supported. EML must be version >= 2.2.0. #' -#' @param directory the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory. +#' @param metadata The metadata object returned by `load_metadata`. If parameter not provided, defaults to calling `load_metadata` in current project directory. #' #' @return message #' @export #' #' @examples #' test_metadata_version() -test_metadata_version <- function(directory = here::here()) { - mymeta <- load_metadata(directory) - if (!is.null(mymeta)) { - vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", mymeta)[1], 1, 5) - vers <- numeric_version(vers) - if (vers < "2.2.0") { - message("ERROR: unsupported EML version: EML must be 2.2.0 or later.\n") - } - if (vers >= "2.2.0") { - message("PASSED: EML version is supported.\n") - } +test_metadata_version <- function(metadata = load_metadata(here::here())) { + + vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", metadata)[1], 1, 5) + vers <- numeric_version(vers) + if (vers < "2.2.0") { + stop(paste("Unsupported EML version: EML must be 2.2.0 or later. Your version is", vers)) + } else { # vers >= 2.2.0 + message(paste0("PASSED: Your EML version (", vers, ") is supported.")) } + + return(invisible(metadata)) } @@ -102,26 +104,24 @@ test_metadata_version <- function(directory = here::here()) { #' #' @details currently, only EML is supported. For now this is just a wrapper form EML::eml_validate(). #' -#' @param directory the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory. +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples #' test_validate_schema() -test_validate_schema <- function(directory = here::here()) { - mymeta <- load_metadata(directory) - if (!is.null(mymeta)) { - val <- EML::eml_validate(mymeta) - if (val == TRUE) { - message("PASSED: Your metada is schema valid.\n") - } - if (val != TRUE) { - message("ERROR: Your is metadata is schema-invalid.\n") - attribs <- attributes(val) - print(attribs) - } +test_validate_schema <- function(metadata = load_metadata(here::here())) { + + val <- EML::eml_validate(metadata) + if (val == TRUE) { + message("PASSED: Your metada is schema valid.") + } else { + attribs <- attributes(val) + stop(paste0("Your is metadata is schema-invalid.\n", attribs)) } + + return(invisible(metadata)) } #' Footer Check @@ -130,22 +130,22 @@ test_validate_schema <- function(directory = here::here()) { #' #' @details If footer lines are not present, the data package passes the test. If footer lines are present, the data package fails the test and the user is instructed to remove footer lines prior to data package upload. Currently only EML metadata are supported. #' -#' @param directory the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory. +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples #' test_footer() -test_footer <- function(directory = here::here()) { - mymeta <- load_metadata(directory) - if (!is.null(mymeta)) { - if (is.null(arcticdatautils::eml_get_simple(mymeta, "numFooterLines")) == TRUE) { - message("Footer Check passed: Metadata indicates data files do not have footers.\n") - } else { - message("Footer Check ERROR: metadata indicates that data files include footers. Please remove all footers from data files.\n") - } +test_footer <- function(metadata = load_metadata(here::here())) { + + if (is.null(arcticdatautils::eml_get_simple(metadata, "numFooterLines"))) { + message("PASSED: Metadata indicates data files do not have footers.\n") + } else { + stop("Metadata indicates that data files include footers. Please remove all footers from data files.") } + + return(invisible(metadata)) } @@ -155,68 +155,58 @@ test_footer <- function(directory = here::here()) { #' #' @details test_header_num examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. #' -#' @param directory the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory. +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples #' test_header_num() -test_header_num <- function(directory = here::here()) { - mymeta <- load_metadata(directory) - if (!is.null(mymeta)) { - header <- arcticdatautils::eml_get_simple(mymeta, "numHeaderLines") - if (is.null(header) == TRUE) { - stop("Header Check ERROR: metadata does not contain information about number of header rows") - } - header_num <- NULL - for (i in seq_along(header)) { - if (header[i] != 1) { - stop("Header Check ERROR: data files must contain exactly one header row") - } else { - header_num <- append(header_num, i) - } - } - if (length(header_num) == length(header_num)) { - message("PASSED header Check: Metadata indicates that each data file contains exactly one header row") - } +test_header_num <- function(metadata = load_metadata(here::here())) { + + header <- arcticdatautils::eml_get_simple(metadata, "numHeaderLines") + names(header) <- arcticdatautils::eml_get_simple(metadata, "entityName") + if (is.null(header)) { + stop("Metadata does not contain information about number of header rows") + } else if (any(header != "1")) { + wrong_headers <- header[header != "1"] + wrong_headers <- paste0(" ", names(wrong_headers), ": ", wrong_headers, collapse = "\n") + stop(paste0("Metadata indicates that the following data files do not contain either zero or more than one header row:\n", wrong_headers)) + } else { + message("PASSED header Check: Metadata indicates that each data file contains exactly one header row") } + + return(invisible(metadata)) } #' Field Delimiter Check #' -#' @description test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). +#' @description test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one character (e.g. ", "). #' #' @details test_delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. #' -#' @param directory the directory where the metadata file is found - i.e. your data package. Defaults to the current working directory. On exit, returns you to the current working directory. +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples #' test_delimiter() -test_delimiter <- function(directory = here::here()) { - # load metadata - mymeta <- load_metadata(directory) - - if (!is.null(mymeta)) { - delimit <- arcticdatautils::eml_get_simple(mymeta, "fieldDelimiter") - if (is.null(delimit) == TRUE) { - stop("Field Delimiter Check ERROR: metadata does not contain information about the field delimiter for data files") - } - delimit_num <- NULL - for (i in seq_along(delimit)) { - if (length(delimit[i]) != 1) { - stop("Field Delimiter Check ERROR: the field delimiter must be a single character") - } else { - delimit_num <- append(delimit_num, i) - } - } - if (length(delimit_num) == length(delimit)) { - message("PASSED: field delimiter check passed: Metadata indicates that each data file contains a field delimiter that is a single character") - } +test_delimiter <- function(metadata = load_metadata(here::here())) { + + delimit <- arcticdatautils::eml_get_simple(metadata, "fieldDelimiter") + names(delimit) <- arcticdatautils::eml_get_simple(metadata, "entityName") + if (is.null(delimit) == TRUE) { + stop("Metadata does not contain information about the field delimiter for data files") + } else if (any(nchar(delimit) != 1)) { + wrong_delimiters <- delimit[nchar(delimit) != 1] + wrong_delimiters <- paste0(" ", names(wrong_delimiters), collapse = "\n") + stop(paste0("Metadata indicates that the following data files do not contain valid delimiters:\n", wrong_delimiters)) + } else { + message("PASSED: field delimiter check passed: Metadata indicates that each data file contains a field delimiter that is a single character") } + + return(invisible(metadata)) } #' Test Metadata for Duplicate Filenames @@ -225,35 +215,33 @@ test_delimiter <- function(directory = here::here()) { #' #' @details specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. #' -#' @param directory the directory where the files for your data package reside. Defaults to the current working directory. +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples test_dup_meta_entries() -test_dup_meta_entries <- function(directory = here::here()) { - # load metadata - mymeta <- load_metadata(directory) +test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { - if (!is.null(mymeta)) { - # get physical elements (and all children elements) - attribs <- EML::eml_get(mymeta, "physical") - # list all file names held in "objectName" - fn <- unlist(attribs)[grepl("objectName", names(unlist(attribs)), fixed = T)] + # get physical elements (and all children elements) + attribs <- EML::eml_get(metadata, "physical") - # find duplicate entries: - dups <- fn[duplicated(fn)] + # list all file names held in "objectName" + fn <- unlist(attribs)[grepl("objectName", names(unlist(attribs)), fixed = T)] - # if no duplicates, test passed: - if (length(dups) == 0) { - message("PASSED: Each data file name is used exactly once in the metadata file.") - } - # if duplicates, test failed: - if (length(dups > 0)) { - cat(paste0("ERROR: metadata file name check failed. Some filenames are used more than once in the metadata:\n", crayon::red$bold(dups))) - } + # find duplicate entries: + dups <- fn[duplicated(fn)] + + # if no duplicates, test passed: + if (length(dups) == 0) { + message("PASSED: Each data file name is used exactly once in the metadata file.") + } else if (length(dups > 0)) { # if duplicates, test failed: + stop(paste0("Metadata file name check failed. Some filenames are used more than once in the metadata:\n", crayon::red$bold(dups))) } + + + return(invisible(metadata)) } #' Test Data Files for Duplicate Names @@ -262,27 +250,27 @@ test_dup_meta_entries <- function(directory = here::here()) { #' #' @details not sure why you'd ever need this function. Seems that most file systems won't let you have duplicate file names, but here it is for the sake of completeness. If you specify a directory other than your current working directory, it will return to the current working directory on exit. #' -#' @param directory path to your data files. Defaults to the current working directory. +#' @inheritParams load_data #' #' @return message #' @export #' #' @examples test_dup_data_files() +#' test_dup_data_files <- function(directory = here::here()) { # get data file filenames (only .csv supported for now): - lf <- list.files(path = directory, pattern = ".csv") + data_files <- list.files(path = directory, pattern = ".csv") # find duplicate entries: - dups <- lf[duplicated(lf)] + dups <- data_files[duplicated(data_files)] # if no duplicates, test passed: if (length(dups) == 0) { message("PASSED: Each data file name is used exactly once.") + } else if (length(dups > 0)) { # if duplicates, test failed: + dups_msg <- paste0("The following data filenames are duplicated:\n", dups) + stop(paste0("Data file name check failed. Some filenames are used more than once.\n", dups_msg)) } - # if duplicates, test failed: - if (length(dups > 0)) { - print(paste0("The following data filenames are duplicated:\n", dups)) - stop("ERROR: data file name check failed. Some filenames are used more than once.") - } + return(invisible(data_files)) } #' File Name Match @@ -291,44 +279,41 @@ test_dup_data_files <- function(directory = here::here()) { #' #' @details If a directory other than the current working directory is specified, test.fileNameMatch returns to the current working directory on exit. Note that the metadata file must follow NPS naming conventions, specifically ending in *_metadata.xml. test.fileNameMatch assumes there are the same number of data files in the directory as dataTables in the metadata file. #' -#' @param directory path to the data files and metadata of a data package. Defaults to the current working directory. +#' @inheritParams load_data +#' @inheritParams test_metadata_version #' #' @return text #' @export #' #' @examples test_file_name_match() -test_file_name_match <- function(directory = here::here()) { - # get metadata filenames from "physical" attribute: - mymeta <- load_metadata(directory) +test_file_name_match <- function(directory = here::here(), metadata = load_metadata(directory)) { - if (!is.null(mymeta)) { - # get physical elements (and all children elements) - phys <- EML::eml_get(mymeta, "physical") + # get physical elements (and all children elements) + phys <- EML::eml_get(metadata, "physical") - # get everything under "objectName" - fn <- unlist(phys)[grepl("objectName", names(unlist(phys)), fixed = T)] + # get everything under "objectName" + files_in_metadata <- unlist(phys)[grepl("objectName", names(unlist(phys)), fixed = T)] - # get filenames from .csv data files in directory: - lf <- list.files(path = directory, pattern = ".csv") + # get filenames from .csv data files in directory: + files_in_dir <- list.files(path = directory, pattern = ".csv") - # items in metadata but not data file names: - meta <- setdiff(fn, lf) + # items in metadata but not data file names: + meta_only <- setdiff(files_in_metadata, files_in_dir) - # items in data file names but not in metadata: - dat <- setdiff(lf, fn) + # items in data file names but not in metadata: + dir_only <- setdiff(files_in_dir, files_in_metadata) - if (length(meta) == 0 && length(dat) == 0) { - message("PASSED: file name congruence check. All data files are listed in metadata and all metdata files names refer to data files.\n") - } - if (length(meta) > 0) { - message("ERROR: metadata lists file names that do not have corresponding data files:") - print(crayon::red$bold(meta)) - } - if (length(dat) > 0) { - message("ERROR: data files exist that are not listed in the metadata:") - cat(crayon::red$bold(dat)) - } + if (length(meta_only) == 0 && length(dir_only) == 0) { + message("PASSED: file name congruence check. All data files are listed in metadata and all metdata files names refer to data files.") + } else if (length(meta_only) > 0 | length(dir_only) > 0) { + meta_txt <- paste("\n", crayon::red$bold(meta_only), collapse = "") + dat_txt <- paste("\n", crayon::red$bold(dir_only), collapse = "") + msg <- paste0(length(meta_only), " files listed in metadata and missing from data folder", meta_txt, + "\n", length(dir_only), " files present in data folder and missing from metadata", dat_txt) + stop(msg) } + + return(invisible(metadata)) } #' Test Number of Fields @@ -337,72 +322,75 @@ test_file_name_match <- function(directory = here::here()) { #' #' @details One thing to be cautious of: test.fieldNum does not compare the order or names of the columns! For now, that's on you. #' -#' @param directory path to the data package files. Defaults to the current working directory. +#' @inheritParams load_data +#' @inheritParams test_metadata_version #' #' @return message #' @export #' #' @examples #' test_field_num() -test_field_num <- function(directory = here::here()) { - # load metadata - mymeta <- load_metadata(directory) - - if (!is.null(mymeta)) { - # get dataTable and all children elements - data_tbl <- EML::eml_get(mymeta, "dataTable") - - # list the filenames associated with each dataTable: - fn <- unlist(data_tbl)[grepl("objectName", names(unlist(data_tbl)), fixed = T)] - - # Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. - - # if only one dataTable: - if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) == 0) { - attribs <- unlist(data_tbl)[grepl("attributeName", names(unlist(data_tbl)), fixed = T)] - assign(paste0("Meta_", fn), NULL) - for (i in seq_along(attribs)) { - assign(paste0("Meta_", fn), append(get(paste0("Meta_", fn)), attribs[[i]])) - } - } - - # if mulitple dataTables: - if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) > 0) { - newdat <- within(data_tbl, rm("@context")) - for (i in seq_along(fn)) { - attriblist <- newdat[[i]][[4]][[1]] - assign(paste0("Meta_", fn[i]), NULL) - for (j in seq_along(attriblist)) { - attribname <- newdat[[i]][[4]][[1]][[j]][[1]] - assign(paste0("Meta_", fn[i]), append(get(paste0("Meta_", fn[i])), attribname)) - } - } - } - - lf <- list.files(path = directory, pattern = ".csv") - - # get first row of each .csv. Assumes there is exactly 1 header row! - for (i in seq_along(lf)) { - colnum <- readLines(lf[i], n = 1) - assign(paste0("Data_", lf[i]), strsplit(colnum, ",")[[1]]) - } - - # Check each CSV. If column number and attribute number are a mismatch, add it to a list. - mismatch <- NULL - for (i in seq_along(lf)) { - if (length(get(paste0("Data_", lf[i]))) != length(get(paste0("Meta_", lf[i])))) { - mismatch <- append(mismatch, lf[i]) - } +test_field_num <- function(directory = here::here(), metadata = load_metadata(directory)) { + + # get dataTable and all children elements + data_tbl <- EML::eml_get(metadata, "dataTable") + + # # list the filenames associated with each dataTable: + # data_files <- unlist(data_tbl)[grepl("objectName", names(unlist(data_tbl)), fixed = T)] + + # Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. + + metadata_attrs <- lapply(data_tbl, function(tbl) {arcticdatautils::eml_get_simple(tbl, "attributeName")}) + metadata_attrs$`@context` <- NULL + names(metadata_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") + + # # if only one dataTable: + # if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) == 0) { + # attribs <- unlist(data_tbl)[grepl("attributeName", names(unlist(data_tbl)), fixed = T)] + # assign(paste0("Meta_", data_files), NULL) + # for (i in seq_along(attribs)) { + # assign(paste0("Meta_", data_files), append(get(paste0("Meta_", data_files)), attribs[[i]])) + # } + # } + # + # # if mulitple dataTables: + # if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) > 0) { + # newdat <- within(data_tbl, rm("@context")) + # for (i in seq_along(data_files)) { + # attriblist <- newdat[[i]][[4]][[1]] + # assign(paste0("Meta_", data_files[i]), NULL) + # for (j in seq_along(attriblist)) { + # attribname <- newdat[[i]][[4]][[1]][[j]][[1]] + # assign(paste0("Meta_", data_files[i]), append(get(paste0("Meta_", data_files[i])), attribname)) + # } + # } + # } + + data_files <- list.files(path = directory, pattern = ".csv") + + # get first row of each .csv. Assumes there is exactly 1 header row! + # for (i in seq_along(lf)) { + # colnum <- readLines(lf[i], n = 1) + # assign(paste0("Data_", lf[i]), strsplit(colnum, ",")[[1]]) + # } + data_colnames <- sapply(data_files, function(data_file) {readLines(file.path(directory, data_file), n = 1)}, USE.NAMES = TRUE, simplify = FALSE) + + # Check each CSV. If column number and attribute number are a mismatch, add it to a list. + mismatch <- NULL + for (i in seq_along(lf)) { + if (length(get(paste0("Data_", lf[i]))) != length(get(paste0("Meta_", lf[i])))) { + mismatch <- append(mismatch, lf[i]) } + } - # if there are any mismatches, print ERROR and specify problematic files: - if (length(mismatch > 0)) { - cat("ERROR: field numer mismatch. Some columns in data files are not listed in metadata or some attributes listed in metadata were not found as headers in the data files: \n") - cat(crayon::red$bold(mismatch), sep = "\n") - } - # if there are no mismatches, print passed msg: - else { - cat("PASSED: field number match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") - } + # if there are any mismatches, print ERROR and specify problematic files: + if (length(mismatch > 0)) { + cat("ERROR: field numer mismatch. Some columns in data files are not listed in metadata or some attributes listed in metadata were not found as headers in the data files: \n") + cat(crayon::red$bold(mismatch), sep = "\n") } + # if there are no mismatches, print passed msg: + else { + cat("PASSED: field number match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") + } + } diff --git a/man/test_delimiter.Rd b/man/test_delimiter.Rd index 33670e2..6434a7a 100644 --- a/man/test_delimiter.Rd +++ b/man/test_delimiter.Rd @@ -4,16 +4,16 @@ \alias{test_delimiter} \title{Field Delimiter Check} \usage{ -test_delimiter(directory = here::here()) +test_delimiter(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the metadata file is found - i.e. your data package. Defaults to the current working directory. On exit, returns you to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message } \description{ -test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one characte (e.g. ", "). +test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one character (e.g. ", "). } \details{ test_delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. diff --git a/man/test_dup_data_files.Rd b/man/test_dup_data_files.Rd index d125a03..9c98c78 100644 --- a/man/test_dup_data_files.Rd +++ b/man/test_dup_data_files.Rd @@ -7,7 +7,7 @@ test_dup_data_files(directory = here::here()) } \arguments{ -\item{directory}{path to your data files. Defaults to the current working directory.} +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} } \value{ message @@ -20,4 +20,5 @@ not sure why you'd ever need this function. Seems that most file systems won't l } \examples{ test_dup_data_files() + } diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd index 4d7c978..f16690e 100644 --- a/man/test_dup_meta_entries.Rd +++ b/man/test_dup_meta_entries.Rd @@ -4,10 +4,10 @@ \alias{test_dup_meta_entries} \title{Test Metadata for Duplicate Filenames} \usage{ -test_dup_meta_entries(directory = here::here()) +test_dup_meta_entries(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the files for your data package reside. Defaults to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message diff --git a/man/test_field_num.Rd b/man/test_field_num.Rd index 8f0e0f7..acae4f6 100644 --- a/man/test_field_num.Rd +++ b/man/test_field_num.Rd @@ -4,10 +4,12 @@ \alias{test_field_num} \title{Test Number of Fields} \usage{ -test_field_num(directory = here::here()) +test_field_num(directory = here::here(), metadata = load_metadata(directory)) } \arguments{ -\item{directory}{path to the data package files. Defaults to the current working directory.} +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} + +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message diff --git a/man/test_file_name_match.Rd b/man/test_file_name_match.Rd index dd9167b..8c7fc04 100644 --- a/man/test_file_name_match.Rd +++ b/man/test_file_name_match.Rd @@ -4,10 +4,15 @@ \alias{test_file_name_match} \title{File Name Match} \usage{ -test_file_name_match(directory = here::here()) +test_file_name_match( + directory = here::here(), + metadata = load_metadata(directory) +) } \arguments{ -\item{directory}{path to the data files and metadata of a data package. Defaults to the current working directory.} +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} + +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ text diff --git a/man/test_footer.Rd b/man/test_footer.Rd index e312c90..95f6ab9 100644 --- a/man/test_footer.Rd +++ b/man/test_footer.Rd @@ -4,10 +4,10 @@ \alias{test_footer} \title{Footer Check} \usage{ -test_footer(directory = here::here()) +test_footer(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message diff --git a/man/test_header_num.Rd b/man/test_header_num.Rd index 06b5b45..a34d97a 100644 --- a/man/test_header_num.Rd +++ b/man/test_header_num.Rd @@ -4,10 +4,10 @@ \alias{test_header_num} \title{Header Check} \usage{ -test_header_num(directory = here::here()) +test_header_num(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message diff --git a/man/test_metadata_version.Rd b/man/test_metadata_version.Rd index 70ea11c..1efd97f 100644 --- a/man/test_metadata_version.Rd +++ b/man/test_metadata_version.Rd @@ -4,10 +4,10 @@ \alias{test_metadata_version} \title{EML Version Check} \usage{ -test_metadata_version(directory = here::here()) +test_metadata_version(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message diff --git a/man/test_validate_schema.Rd b/man/test_validate_schema.Rd index 281cc15..f56e7a3 100644 --- a/man/test_validate_schema.Rd +++ b/man/test_validate_schema.Rd @@ -4,10 +4,10 @@ \alias{test_validate_schema} \title{Validate Metadata Schema} \usage{ -test_validate_schema(directory = here::here()) +test_validate_schema(metadata = load_metadata(here::here())) } \arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ message From 4277b3019e6f3ca04028b567e060ae1cd10986bd Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 10:40:18 -0600 Subject: [PATCH 07/60] Change test_field_num to test_fields_match Checks for mismatched field names and order now --- NAMESPACE | 2 +- R/tabular_data_congruence.R | 103 +++++++++++++++++------------------- man/test_field_num.Rd | 25 --------- man/test_fields_match.Rd | 28 ++++++++++ 4 files changed, 78 insertions(+), 80 deletions(-) delete mode 100644 man/test_field_num.Rd create mode 100644 man/test_fields_match.Rd diff --git a/NAMESPACE b/NAMESPACE index 2f0dfdc..62acbe4 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -5,7 +5,7 @@ export(load_metadata) export(test_delimiter) export(test_dup_data_files) export(test_dup_meta_entries) -export(test_field_num) +export(test_fields_match) export(test_file_name_match) export(test_footer) export(test_header_num) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index e71b218..2beb0cb 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -316,81 +316,76 @@ test_file_name_match <- function(directory = here::here(), metadata = load_metad return(invisible(metadata)) } -#' Test Number of Fields +#' Test Matching Data/Metadata Fields #' -#' @description test_field_num compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. +#' @description test_fields_match compares the attributes of each dataTable within the EML metadata to the columns in the corresponding .csv. If the columns have the same names and order, the test passes. If the columns differ, the test fails. #' -#' @details One thing to be cautious of: test.fieldNum does not compare the order or names of the columns! For now, that's on you. +#' @details test_fields_match briefly checks that data files match, but you should really run `test_file_name_match()` before you run this test. #' #' @inheritParams load_data #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples -#' test_field_num() -test_field_num <- function(directory = here::here(), metadata = load_metadata(directory)) { +#' test_fields_match() +test_fields_match <- function(directory = here::here(), metadata = load_metadata(directory)) { # get dataTable and all children elements data_tbl <- EML::eml_get(metadata, "dataTable") - # # list the filenames associated with each dataTable: - # data_files <- unlist(data_tbl)[grepl("objectName", names(unlist(data_tbl)), fixed = T)] - - # Make a list of each filename ("Meta_") that contains the names of the attributes associated with each data file. - + # Get list of attributes for each table in the metadata metadata_attrs <- lapply(data_tbl, function(tbl) {arcticdatautils::eml_get_simple(tbl, "attributeName")}) metadata_attrs$`@context` <- NULL names(metadata_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") - # # if only one dataTable: - # if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) == 0) { - # attribs <- unlist(data_tbl)[grepl("attributeName", names(unlist(data_tbl)), fixed = T)] - # assign(paste0("Meta_", data_files), NULL) - # for (i in seq_along(attribs)) { - # assign(paste0("Meta_", data_files), append(get(paste0("Meta_", data_files)), attribs[[i]])) - # } - # } - # - # # if mulitple dataTables: - # if (length(suppressWarnings(within(data_tbl[1], rm("@context")))) > 0) { - # newdat <- within(data_tbl, rm("@context")) - # for (i in seq_along(data_files)) { - # attriblist <- newdat[[i]][[4]][[1]] - # assign(paste0("Meta_", data_files[i]), NULL) - # for (j in seq_along(attriblist)) { - # attribname <- newdat[[i]][[4]][[1]][[j]][[1]] - # assign(paste0("Meta_", data_files[i]), append(get(paste0("Meta_", data_files[i])), attribname)) - # } - # } - # } - + # Get list of column names for each table in the csv data data_files <- list.files(path = directory, pattern = ".csv") + data_colnames <- sapply(data_files, function(data_file) {names(readr::read_csv(file.path(directory, data_file), n_max = 1, show_col_types = FALSE))}, USE.NAMES = TRUE, simplify = FALSE) - # get first row of each .csv. Assumes there is exactly 1 header row! - # for (i in seq_along(lf)) { - # colnum <- readLines(lf[i], n = 1) - # assign(paste0("Data_", lf[i]), strsplit(colnum, ",")[[1]]) - # } - data_colnames <- sapply(data_files, function(data_file) {readLines(file.path(directory, data_file), n = 1)}, USE.NAMES = TRUE, simplify = FALSE) - - # Check each CSV. If column number and attribute number are a mismatch, add it to a list. - mismatch <- NULL - for (i in seq_along(lf)) { - if (length(get(paste0("Data_", lf[i]))) != length(get(paste0("Meta_", lf[i])))) { - mismatch <- append(mismatch, lf[i]) - } + # Quick check that tables match + if (!(all(names(data_colnames) %in% names(metadata_attrs)) & all(names(metadata_attrs) %in% names(data_colnames)))) { + stop("Mismatch in data filenames and files listed in metadata. Call `test_file_name_match()` for more info.") } - # if there are any mismatches, print ERROR and specify problematic files: - if (length(mismatch > 0)) { - cat("ERROR: field numer mismatch. Some columns in data files are not listed in metadata or some attributes listed in metadata were not found as headers in the data files: \n") - cat(crayon::red$bold(mismatch), sep = "\n") - } - # if there are no mismatches, print passed msg: - else { - cat("PASSED: field number match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") + # Check each CSV. If column and attributes are a mismatch, describe the issue + mismatches <- sapply(data_files, function(data_file) { + meta_cols <- metadata_attrs[[data_file]] + data_cols <- data_colnames[[data_file]] + if (length(meta_cols) == length(data_cols) && all(meta_cols == data_cols)) { # Columns match and are in right order + return(NULL) + } else if (all(meta_cols %in% data_cols) && all(data_cols %in% meta_cols)) { # Columns match and are in wrong order + return("Metadata column order does not match data column order") + } else { # Columns don't match + missing_from_meta <- paste(data_cols[!(data_cols %in% meta_cols)], collapse = ", ") + missing_from_data <- paste(meta_cols[!(meta_cols %in% data_cols)], collapse = ", ") + if (missing_from_meta != "") { + missing_from_meta <- paste0("Data column(s) ", crayon::red$bold(missing_from_meta), " missing from metadata") + } else { + missing_from_meta <- NULL + } + if (missing_from_data != "") { + missing_from_data <- paste0("Metadata column(s) ", crayon::red$bold(missing_from_data), " missing from data") + } else { + missing_from_data <- NULL + } + return(paste0(paste(c(missing_from_data, missing_from_meta), collapse = ". "), ".")) + } + }, USE.NAMES = TRUE, simplify = FALSE) + + # Remove tables from list that pass the test, and convert it to a named vector + mismatches <- purrr::discard(mismatches, is.null) %>% + unlist() + + # If there are mismatches, throw an error, otherwise, print a message indicating passed test + if (!is.null(mismatches)) { + msg <- paste0(names(mismatches), ": ", mismatches, collapse = "\n") + msg <- paste("Field mismatch between data and metadata:\n", msg) + stop(msg) + } else { + message("PASSED: fields match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") } + return(invisible(metadata)) } diff --git a/man/test_field_num.Rd b/man/test_field_num.Rd deleted file mode 100644 index acae4f6..0000000 --- a/man/test_field_num.Rd +++ /dev/null @@ -1,25 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/tabular_data_congruence.R -\name{test_field_num} -\alias{test_field_num} -\title{Test Number of Fields} -\usage{ -test_field_num(directory = here::here(), metadata = load_metadata(directory)) -} -\arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} - -\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} -} -\value{ -message -} -\description{ -test_field_num compares the number of attributes each dataTable within the EML metadata to the number of columns for the corresponding .csv. If the numbers are the same, the test passes. If the numbers differ, the test fails. -} -\details{ -One thing to be cautious of: test.fieldNum does not compare the order or names of the columns! For now, that's on you. -} -\examples{ -test_field_num() -} diff --git a/man/test_fields_match.Rd b/man/test_fields_match.Rd new file mode 100644 index 0000000..aaf105a --- /dev/null +++ b/man/test_fields_match.Rd @@ -0,0 +1,28 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{test_fields_match} +\alias{test_fields_match} +\title{Test Matching Data/Metadata Fields} +\usage{ +test_fields_match( + directory = here::here(), + metadata = load_metadata(directory) +) +} +\arguments{ +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} + +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} +} +\value{ +Invisibly returns \code{metadata}. +} +\description{ +test_fields_match compares the attributes of each dataTable within the EML metadata to the columns in the corresponding .csv. If the columns have the same names and order, the test passes. If the columns differ, the test fails. +} +\details{ +test_fields_match briefly checks that data files match, but you should really run \code{test_file_name_match()} before you run this test. +} +\examples{ +test_fields_match() +} From 8d772b20e4412405e37db8c2149379257037038f Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 10:41:36 -0600 Subject: [PATCH 08/60] Update return value documentation Closes #10, closes #8 --- R/tabular_data_congruence.R | 17 ++++++++--------- man/test_delimiter.Rd | 2 +- man/test_dup_data_files.Rd | 2 +- man/test_dup_meta_entries.Rd | 2 +- man/test_file_name_match.Rd | 2 +- man/test_footer.Rd | 2 +- man/test_header_num.Rd | 2 +- man/test_metadata_version.Rd | 2 +- man/test_validate_schema.Rd | 2 +- 9 files changed, 16 insertions(+), 17 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 2beb0cb..a2a616b 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -79,7 +79,7 @@ load_data <- function(directory = here::here()) { #' #' @param metadata The metadata object returned by `load_metadata`. If parameter not provided, defaults to calling `load_metadata` in current project directory. #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples @@ -106,7 +106,7 @@ test_metadata_version <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples @@ -132,7 +132,7 @@ test_validate_schema <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples @@ -157,7 +157,7 @@ test_footer <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples @@ -187,7 +187,7 @@ test_header_num <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples @@ -217,7 +217,7 @@ test_delimiter <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams test_metadata_version #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples test_dup_meta_entries() @@ -252,7 +252,7 @@ test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { #' #' @inheritParams load_data #' -#' @return message +#' @return Invisibly returns `metadata`. #' @export #' #' @examples test_dup_data_files() @@ -282,9 +282,8 @@ test_dup_data_files <- function(directory = here::here()) { #' @inheritParams load_data #' @inheritParams test_metadata_version #' -#' @return text +#' @return Invisibly returns `metadata`. #' @export -#' #' @examples test_file_name_match() test_file_name_match <- function(directory = here::here(), metadata = load_metadata(directory)) { diff --git a/man/test_delimiter.Rd b/man/test_delimiter.Rd index 6434a7a..1c506c0 100644 --- a/man/test_delimiter.Rd +++ b/man/test_delimiter.Rd @@ -10,7 +10,7 @@ test_delimiter(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_delimiter checks the metadata file and ensures that each data file has a field delimiter with exactly one character (e.g. ", "). diff --git a/man/test_dup_data_files.Rd b/man/test_dup_data_files.Rd index 9c98c78..1542ad2 100644 --- a/man/test_dup_data_files.Rd +++ b/man/test_dup_data_files.Rd @@ -10,7 +10,7 @@ test_dup_data_files(directory = here::here()) \item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_dup_data_files looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd index f16690e..4832bca 100644 --- a/man/test_dup_meta_entries.Rd +++ b/man/test_dup_meta_entries.Rd @@ -10,7 +10,7 @@ test_dup_meta_entries(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_dup_meta_entries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. diff --git a/man/test_file_name_match.Rd b/man/test_file_name_match.Rd index 8c7fc04..6e86864 100644 --- a/man/test_file_name_match.Rd +++ b/man/test_file_name_match.Rd @@ -15,7 +15,7 @@ test_file_name_match( \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -text +Invisibly returns \code{metadata}. } \description{ test_file_name_match checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. diff --git a/man/test_footer.Rd b/man/test_footer.Rd index 95f6ab9..ba98f4d 100644 --- a/man/test_footer.Rd +++ b/man/test_footer.Rd @@ -10,7 +10,7 @@ test_footer(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_footer checks the metadata files to determine whether data files contain footer lines or not. diff --git a/man/test_header_num.Rd b/man/test_header_num.Rd index a34d97a..1a71f40 100644 --- a/man/test_header_num.Rd +++ b/man/test_header_num.Rd @@ -10,7 +10,7 @@ test_header_num(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_header_num checks the metadata files to ensure that each data file contains exactly one header row. diff --git a/man/test_metadata_version.Rd b/man/test_metadata_version.Rd index 1efd97f..908e1af 100644 --- a/man/test_metadata_version.Rd +++ b/man/test_metadata_version.Rd @@ -10,7 +10,7 @@ test_metadata_version(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_metadata_version determines whether the version of the metadata supplied meets the current criteria for an NPS data package. diff --git a/man/test_validate_schema.Rd b/man/test_validate_schema.Rd index f56e7a3..a82b560 100644 --- a/man/test_validate_schema.Rd +++ b/man/test_validate_schema.Rd @@ -10,7 +10,7 @@ test_validate_schema(metadata = load_metadata(here::here())) \item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} } \value{ -message +Invisibly returns \code{metadata}. } \description{ test_validate_schema inspects a metadata object loaded into R and determines whether it is schema-valid. From bc9ab0c6645528ee0200d394e86df1390466a9ea Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 10:57:05 -0600 Subject: [PATCH 09/60] Update gitignore --- .gitignore | 1 + 1 file changed, 1 insertion(+) diff --git a/.gitignore b/.gitignore index 5b6a065..26b96c6 100644 --- a/.gitignore +++ b/.gitignore @@ -2,3 +2,4 @@ .Rhistory .RData .Ruserdata +scratchpad/* From 35eba95b87073969cc9874bb5ee15091b242dbb4 Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 13:38:15 -0600 Subject: [PATCH 10/60] Fix logical operators --- R/tabular_data_congruence.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index a2a616b..0e690ac 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -303,8 +303,8 @@ test_file_name_match <- function(directory = here::here(), metadata = load_metad dir_only <- setdiff(files_in_dir, files_in_metadata) if (length(meta_only) == 0 && length(dir_only) == 0) { - message("PASSED: file name congruence check. All data files are listed in metadata and all metdata files names refer to data files.") - } else if (length(meta_only) > 0 | length(dir_only) > 0) { + message("PASSED: file name congruence check. All data files are listed in metadata and all metadata files names refer to data files.") + } else if (length(meta_only) > 0 || length(dir_only) > 0) { meta_txt <- paste("\n", crayon::red$bold(meta_only), collapse = "") dat_txt <- paste("\n", crayon::red$bold(dir_only), collapse = "") msg <- paste0(length(meta_only), " files listed in metadata and missing from data folder", meta_txt, From 6646e7dc1918a3bd1fd8a69ac52b753bd9ce5162 Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 13:41:49 -0600 Subject: [PATCH 11/60] In test_file_name_match, handle case where only one data table --- R/tabular_data_congruence.R | 4 ++++ 1 file changed, 4 insertions(+) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 0e690ac..32413f1 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -333,6 +333,10 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata # get dataTable and all children elements data_tbl <- EML::eml_get(metadata, "dataTable") + # If there's only one csv, data_tbl ends up with one less level of nesting. Re-nest it so that the rest of the code works consistently + if ("attributeList" %in% names(data_tbl)) { + data_tbl <- list(data_tbl) + } # Get list of attributes for each table in the metadata metadata_attrs <- lapply(data_tbl, function(tbl) {arcticdatautils::eml_get_simple(tbl, "attributeName")}) From 50d570f3b462afe51cc0e371d47197b66a667795 Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 13:57:20 -0600 Subject: [PATCH 12/60] Add script to try out tests Will run tests on an arbitrary number of data packages as long as they're all in the same folder --- run_all_tests.R | 23 +++++++++++++++++++++++ 1 file changed, 23 insertions(+) create mode 100644 run_all_tests.R diff --git a/run_all_tests.R b/run_all_tests.R new file mode 100644 index 0000000..00c52db --- /dev/null +++ b/run_all_tests.R @@ -0,0 +1,23 @@ +dirs <- list.dirs(here::here("scratchpad")) +dirs <- dirs[-1] + +for (dir in dirs) { + cat(paste(crayon::blue$bold(basename(dir)), "\n")) + + meta <- try(load_metadata(dir)) + data <- try(load_data(dir)) + + if (!any("try-error" %in% class(meta))) { + try(test_validate_schema(meta)) + try(test_metadata_version(meta)) + try(test_delimiter(meta)) + try(test_footer(meta)) + try(test_header_num(meta)) + try(test_dup_data_files(dir)) + try(test_dup_meta_entries(meta)) + try(test_file_name_match(dir, meta)) + try(test_fields_match(dir, meta)) + } + + cat("\n") +} From 148f35de6bc9f89d3e6576f21f4fa6e44532144d Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 16:46:38 -0600 Subject: [PATCH 13/60] First stab at testing numeric fields Still needs work --- NAMESPACE | 1 + R/tabular_data_congruence.R | 67 +++++++++++++++++++++++++++++++++++++ man/test_numeric_fields.Rd | 28 ++++++++++++++++ run_all_tests.R | 1 + 4 files changed, 97 insertions(+) create mode 100644 man/test_numeric_fields.Rd diff --git a/NAMESPACE b/NAMESPACE index 62acbe4..0f59788 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -10,4 +10,5 @@ export(test_file_name_match) export(test_footer) export(test_header_num) export(test_metadata_version) +export(test_numeric_fields) export(test_validate_schema) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 32413f1..68b749a 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -392,3 +392,70 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata return(invisible(metadata)) } + +#' Test Numeric Fields +#' +#' @description test_numeric_fields verifies that all columns listed as numeric in the metadata are free of non-numeric data. +#' +#' @details "NA" and missing data codes documented in the metadata will *not* cause this test to fail. +#' +#' @inheritParams load_data +#' @inheritParams test_metadata_version +#' +#' @return Invisibly returns `metadata`. +#' @export +#' +#' @examples +#' test_numeric_fields() +test_numeric_fields <- function(directory = here::here(), metadata = load_metadata(directory)) { + + # get dataTable and all children elements + data_tbl <- EML::eml_get(metadata, "dataTable") + data_tbl$`@context` <- NULL + # If there's only one csv, data_tbl ends up with one less level of nesting. Re-nest it so that the rest of the code works consistently + if ("attributeList" %in% names(data_tbl)) { + data_tbl <- list(data_tbl) + } + + # Get list of attributes for each table in the metadata + metadata_attrs <- lapply(data_tbl, function(tbl) { + attrs <- suppressMessages(EML::get_attributes(tbl$attributeList)) + attrs <- attrs$attributes + attrs <- dplyr::filter(attrs, domain == "numericDomain") + return(attrs) + }) + metadata_attrs$`@context` <- NULL + names(metadata_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") + + # Get list of column names for each table in the csv data + data_files <- list.files(path = directory, pattern = ".csv") + data_non_numeric <- sapply(data_files, function(data_file) { + na_strings <- c("", "NA") + if ("missingValueCode" %in% names(metadata_attrs[[data_file]])) { + na_strings <- c(na_strings, unique(metadata_attrs[[data_file]]$missingValueCode)) + } + num_data <- readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(metadata_attrs[[data_file]]$attributeName), na = na_strings, show_col_types = FALSE) + non_numeric <- dplyr::select(num_data, !where(is.numeric)) + if (ncol(non_numeric) > 0) { + return(paste(names(non_numeric), sep = ", ")) # List non-numeric columns + } else { + return(NULL) + } + }, + USE.NAMES = TRUE, simplify = FALSE) + + # This will be null unless supposedly numeric columns read in as non-numeric + data_non_numeric <- purrr::discard(data_non_numeric, is.null) + data_non_numeric <- unlist(data_non_numeric) + + # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test + if (!is.null(data_non_numeric)) { + msg <- paste0(names(data_non_numeric), ": ", data_non_numeric, collapse = "\n") + msg <- paste("Columns indicated as numeric in metadata contain non-numeric values:\n", msg) + stop(msg) + } else { + message("PASSED: Columns indicated as numeric in metadata contain only numeric values and valid missing value codes.") + } + + return(invisible(metadata)) +} diff --git a/man/test_numeric_fields.Rd b/man/test_numeric_fields.Rd new file mode 100644 index 0000000..2d8e3e7 --- /dev/null +++ b/man/test_numeric_fields.Rd @@ -0,0 +1,28 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{test_numeric_fields} +\alias{test_numeric_fields} +\title{Test Numeric Fields} +\usage{ +test_numeric_fields( + directory = here::here(), + metadata = load_metadata(directory) +) +} +\arguments{ +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} + +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} +} +\value{ +Invisibly returns \code{metadata}. +} +\description{ +test_numeric_fields verifies that all columns listed as numeric in the metadata are free of non-numeric data. +} +\details{ +"NA" and missing data codes documented in the metadata will \emph{not} cause this test to fail. +} +\examples{ +test_numeric_fields() +} diff --git a/run_all_tests.R b/run_all_tests.R index 00c52db..e14f9d6 100644 --- a/run_all_tests.R +++ b/run_all_tests.R @@ -17,6 +17,7 @@ for (dir in dirs) { try(test_dup_meta_entries(meta)) try(test_file_name_match(dir, meta)) try(test_fields_match(dir, meta)) + try(test_numeric_fields(dir, meta)) } cat("\n") From 9efc4f85e6e9acadfc8935928092429412b16ca8 Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 27 Oct 2022 16:46:52 -0600 Subject: [PATCH 14/60] Typo fix --- R/tabular_data_congruence.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 68b749a..b74f721 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -115,7 +115,7 @@ test_validate_schema <- function(metadata = load_metadata(here::here())) { val <- EML::eml_validate(metadata) if (val == TRUE) { - message("PASSED: Your metada is schema valid.") + message("PASSED: Your metadata is schema valid.") } else { attribs <- attributes(val) stop(paste0("Your is metadata is schema-invalid.\n", attribs)) From 03c3ed514cb135bffc6869c1408ee7d16172afb4 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 31 Oct 2022 11:33:39 -0600 Subject: [PATCH 15/60] Add ability to use magrittr pipes --- DESCRIPTION | 3 ++- NAMESPACE | 1 + R/DPchecker-package.R | 7 +++++++ man/DPchecker-package.Rd | 11 +++++++++++ 4 files changed, 21 insertions(+), 1 deletion(-) create mode 100644 R/DPchecker-package.R create mode 100644 man/DPchecker-package.Rd diff --git a/DESCRIPTION b/DESCRIPTION index fc87764..9e11733 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -18,4 +18,5 @@ Imports: crayon, here, EML, - readr + readr, + magrittr diff --git a/NAMESPACE b/NAMESPACE index 0f59788..3bef040 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -12,3 +12,4 @@ export(test_header_num) export(test_metadata_version) export(test_numeric_fields) export(test_validate_schema) +importFrom(magrittr,"%>%") diff --git a/R/DPchecker-package.R b/R/DPchecker-package.R new file mode 100644 index 0000000..ebc9994 --- /dev/null +++ b/R/DPchecker-package.R @@ -0,0 +1,7 @@ +#' @keywords internal +"_PACKAGE" + +## usethis namespace: start +#' @importFrom magrittr %>% +## usethis namespace: end +NULL diff --git a/man/DPchecker-package.Rd b/man/DPchecker-package.Rd new file mode 100644 index 0000000..8d15a0f --- /dev/null +++ b/man/DPchecker-package.Rd @@ -0,0 +1,11 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/DPchecker-package.R +\docType{package} +\name{DPchecker-package} +\alias{DPchecker} +\alias{DPchecker-package} +\title{DPchecker: Checks Data Packages for Congruence} +\description{ +Allows the user (and reviewer) to check a data package and test whether it meets the congruence standards set forth by NPS for upload to DataStore as a datapackage. +} +\keyword{internal} From 526d842950b68b3c97739ff7aca7893482279f9b Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 31 Oct 2022 14:41:41 -0600 Subject: [PATCH 16/60] Fix test_fields_match() --- DESCRIPTION | 3 ++- R/tabular_data_congruence.R | 36 ++++++++++++++++++++++++++---------- 2 files changed, 28 insertions(+), 11 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 9e11733..7b5712d 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -19,4 +19,5 @@ Imports: here, EML, readr, - magrittr + magrittr, + tidyselect diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index b74f721..19d4aca 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -397,7 +397,7 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata #' #' @description test_numeric_fields verifies that all columns listed as numeric in the metadata are free of non-numeric data. #' -#' @details "NA" and missing data codes documented in the metadata will *not* cause this test to fail. +#' @details "NA" and missing data codes documented in the metadata will *not* cause this test to fail. Note that this test assumes that the column types that are in the metadata are the intended types, i.e., if your metadata says a column is text and it should actually be numeric, it will not be caught by this test. #' #' @inheritParams load_data #' @inheritParams test_metadata_version @@ -418,26 +418,42 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada } # Get list of attributes for each table in the metadata - metadata_attrs <- lapply(data_tbl, function(tbl) { + numeric_attrs <- lapply(data_tbl, function(tbl) { attrs <- suppressMessages(EML::get_attributes(tbl$attributeList)) attrs <- attrs$attributes attrs <- dplyr::filter(attrs, domain == "numericDomain") return(attrs) }) - metadata_attrs$`@context` <- NULL - names(metadata_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") + numeric_attrs$`@context` <- NULL + names(numeric_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") # Get list of column names for each table in the csv data data_files <- list.files(path = directory, pattern = ".csv") data_non_numeric <- sapply(data_files, function(data_file) { + num_col_names <- numeric_attrs[[data_file]]$attributeName + # If the table doesn't have any numeric columns listed in the metadata, it automatically passes + if (length(num_col_names) == 0) { + return(NULL) + } na_strings <- c("", "NA") - if ("missingValueCode" %in% names(metadata_attrs[[data_file]])) { - na_strings <- c(na_strings, unique(metadata_attrs[[data_file]]$missingValueCode)) + if ("missingValueCode" %in% names(numeric_attrs[[data_file]])) { + na_strings <- c(na_strings, unique(numeric_attrs[[data_file]]$missingValueCode)) } - num_data <- readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(metadata_attrs[[data_file]]$attributeName), na = na_strings, show_col_types = FALSE) - non_numeric <- dplyr::select(num_data, !where(is.numeric)) - if (ncol(non_numeric) > 0) { - return(paste(names(non_numeric), sep = ", ")) # List non-numeric columns + # Read everything as character, then see if it fails when converting to number + num_data <- readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(num_col_names), na = na_strings, col_types = rep("c", length(num_col_names)), show_col_types = FALSE) + non_numeric <- sapply(names(num_data), function(col) { + col_data <- num_data[[col]] + col_data <- col_data[!is.na(col_data)] + col_data <- suppressWarnings(as.numeric(col_data)) + if (any(is.na(col_data))) { + return(col) + } else { + return(NULL) + } + }, simplify = FALSE, USE.NAMES = TRUE) + non_numeric <- purrr::discard(non_numeric, is.null) + if (length(names(non_numeric)) > 0) { + return(paste(names(non_numeric), collapse = ", ")) # List non-numeric columns } else { return(NULL) } From b0e0c1166cd14df828b79f2e14be7f267781d2fe Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 31 Oct 2022 14:52:11 -0600 Subject: [PATCH 17/60] Add comments to testing script --- run_all_tests.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/run_all_tests.R b/run_all_tests.R index e14f9d6..f9c1d86 100644 --- a/run_all_tests.R +++ b/run_all_tests.R @@ -1,5 +1,5 @@ dirs <- list.dirs(here::here("scratchpad")) -dirs <- dirs[-1] +dirs <- dirs[-1] # get rid of root dir for (dir in dirs) { cat(paste(crayon::blue$bold(basename(dir)), "\n")) @@ -7,7 +7,7 @@ for (dir in dirs) { meta <- try(load_metadata(dir)) data <- try(load_data(dir)) - if (!any("try-error" %in% class(meta))) { + if (!any("try-error" %in% class(meta))) { # Run tests unless metadata fails to load try(test_validate_schema(meta)) try(test_metadata_version(meta)) try(test_delimiter(meta)) From b761f0f373d172abfebcde114f15f3f587ea2cc7 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 4 Nov 2022 16:53:07 -0600 Subject: [PATCH 18/60] Add date range check. Currently breaks for anything not in ISO format --- NAMESPACE | 1 + R/tabular_data_congruence.R | 108 ++++++++++++++++++++++++++++++++++++ man/test_date_range.Rd | 25 +++++++++ 3 files changed, 134 insertions(+) create mode 100644 man/test_date_range.Rd diff --git a/NAMESPACE b/NAMESPACE index 3bef040..f877ecd 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -2,6 +2,7 @@ export(load_data) export(load_metadata) +export(test_date_range) export(test_delimiter) export(test_dup_data_files) export(test_dup_meta_entries) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 19d4aca..88dea8f 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -475,3 +475,111 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada return(invisible(metadata)) } + +#' Test Date Range +#' +#' @description test_date_range verifies that dates in the dataset are consistent with the date range in the metadata. +#' +#' @details Currently, this function operates on the assumption that the dates and times in your dataset are stored in a valid ISO format. If your dates/times are in a different format, this function may behave unpredictably. +#' +#' @inheritParams load_data +#' @inheritParams test_metadata_version +#' +#' @return Invisibly returns `metadata`. +#' @export +#' +#' @examples +#' test_date_range() +test_date_range <- function(directory = here::here(), metadata = load_metadata(directory)) { + + # get dataTable and all children elements + data_tbl <- EML::eml_get(metadata, "dataTable") + data_tbl$`@context` <- NULL + # If there's only one csv, data_tbl ends up with one less level of nesting. Re-nest it so that the rest of the code works consistently + if ("attributeList" %in% names(data_tbl)) { + data_tbl <- list(data_tbl) + } + + # Get begin date from metadata + meta_begin_date <- readr::parse_datetime(EMLeditor::get.beginDate(metadata), format = "%d %B %Y") + meta_end_date <- readr::parse_datetime(EMLeditor::get.endDate(metadata), format = "%d %B %Y") + meta_date_range <- c(begin = meta_begin_date, end = meta_end_date) + + # Check if temporal coverage info is complete + if (all(is.na(meta_date_range))) { + warning("Metadata does not contain temporal coverage information.") + return(metadata) + } else if (any(is.na(meta_date_range))) { + missing_date <- names(meta_date_range[is.na(meta_date_range)]) + present_date <- names(meta_date_range[!is.na(meta_date_range)]) + warning(paste("Metadata temporal coverage is missing", missing_date, "date. This test will still check data against", present_date, "date.")) + } + + # Get list of date/time attributes for each table in the metadata + dttm_attrs <- lapply(data_tbl, function(tbl) { + attrs <- suppressMessages(EML::get_attributes(tbl$attributeList)) + attrs <- attrs$attributes + attrs <- dplyr::filter(attrs, domain == "dateTimeDomain") + return(attrs) + }) + dttm_attrs$`@context` <- NULL + names(dttm_attrs) <- arcticdatautils::eml_get_simple(data_tbl, "objectName") + + # For each csv table, check that date/time columns are consistent with temporal coverage in metadata. List out tables and columns that are not in compliance. + data_files <- list.files(path = directory, pattern = ".csv") + data_out_of_range <- sapply(data_files, function(data_file) { + dttm_col_names <- dttm_attrs[[data_file]]$attributeName + # If the table doesn't have any date/time columns listed in the metadata, it automatically passes + if (length(dttm_col_names) == 0) { + return(NULL) + } + # Get format string for each date/time column and filter out anything that doesn't have a year associated with it + dttm_formats <- dttm_attrs[[data_file]]$formatString + dttm_col_names <- dttm_col_names[grepl("Y", dttm_formats)] + dttm_formats <- dttm_formats[grepl("Y", dttm_formats)] + + # Read date/time columns, find max/min, and compare with max and min dates in metadata + na_strings <- c("", "NA") + if ("missingValueCode" %in% names(dttm_attrs[[data_file]])) { + na_strings <- c(na_strings, unique(dttm_attrs[[data_file]]$missingValueCode)) + } + dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = readr::cols(.default = readr::col_datetime()), show_col_types = FALSE)) + out_of_range <- sapply(names(dttm_data), function(col) { + col_data <- dttm_data[[col]] + if (all(is.na(col_data))) { + return(paste(col, "(failed to parse)")) + } + max_date <- max(col_data, na.rm = TRUE) + min_date <- min(col_data, na.rm = TRUE) + if (max_date > meta_end_date || min_date < meta_begin_date) { + return(paste0(col, " [", min_date, ", ", max_date, "]")) # column name and actual date range + } else { + return(NULL) + } + }, simplify = FALSE, USE.NAMES = TRUE) + out_of_range <- purrr::discard(out_of_range, is.null) + if (length(names(out_of_range)) > 0) { + return(paste(out_of_range, collapse = ", ")) # List out of range date columns + } else { + return(NULL) + } + }, + USE.NAMES = TRUE, simplify = FALSE) + + # This will be null unless supposedly numeric columns read in as non-numeric + data_out_of_range <- purrr::discard(data_out_of_range, is.null) + data_out_of_range <- unlist(data_out_of_range) + + # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test + if (!is.null(data_out_of_range)) { + msg <- paste0(names(data_out_of_range), ": ", data_out_of_range, collapse = "\n") + msg <- paste0("The following date/time columns are out of the range [", meta_begin_date, ", ", meta_end_date, "] specified in the metadata:\n", msg) + stop(msg) + } else { + message("PASSED: Columns indicated as date/time in metadata are within the stated temporal coverage range.") + } + + return(invisible(metadata)) +} + + diff --git a/man/test_date_range.Rd b/man/test_date_range.Rd new file mode 100644 index 0000000..2a4d30f --- /dev/null +++ b/man/test_date_range.Rd @@ -0,0 +1,25 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{test_date_range} +\alias{test_date_range} +\title{Test Date Range} +\usage{ +test_date_range(directory = here::here(), metadata = load_metadata(directory)) +} +\arguments{ +\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} + +\item{metadata}{The metadata object returned by \code{load_metadata}. If parameter not provided, defaults to calling \code{load_metadata} in current project directory.} +} +\value{ +Invisibly returns \code{metadata}. +} +\description{ +test_date_range verifies that dates in the dataset are consistent with the date range in the metadata. +} +\details{ +Currently, this function operates on the assumption that the dates and times in your dataset are stored in a valid ISO format. If your dates/times are in a different format, this function may behave unpredictably. +} +\examples{ +test_date_range() +} From a36960e858662a7ed914f93eae4a10a9a7018c89 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 4 Nov 2022 16:53:23 -0600 Subject: [PATCH 19/60] Documentation tweak --- man/test_numeric_fields.Rd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/man/test_numeric_fields.Rd b/man/test_numeric_fields.Rd index 2d8e3e7..55f0011 100644 --- a/man/test_numeric_fields.Rd +++ b/man/test_numeric_fields.Rd @@ -21,7 +21,7 @@ Invisibly returns \code{metadata}. test_numeric_fields verifies that all columns listed as numeric in the metadata are free of non-numeric data. } \details{ -"NA" and missing data codes documented in the metadata will \emph{not} cause this test to fail. +"NA" and missing data codes documented in the metadata will \emph{not} cause this test to fail. Note that this test assumes that the column types that are in the metadata are the intended types, i.e., if your metadata says a column is text and it should actually be numeric, it will not be caught by this test. } \examples{ test_numeric_fields() From 5f286e28e7af7cefb340f1b028d390fd0d344f65 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 4 Nov 2022 17:19:21 -0600 Subject: [PATCH 20/60] Add function for converting EML datetime format strings to R-compatible format strings Will move to a more appropriate package eventually --- NAMESPACE | 1 + R/tabular_data_congruence.R | 21 +++++++++++++++++++++ man/convert_datetime_format.Rd | 20 ++++++++++++++++++++ 3 files changed, 42 insertions(+) create mode 100644 man/convert_datetime_format.Rd diff --git a/NAMESPACE b/NAMESPACE index f877ecd..faf3777 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,5 +1,6 @@ # Generated by roxygen2: do not edit by hand +export(convert_datetime_format) export(load_data) export(load_metadata) export(test_date_range) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 88dea8f..0d5faaa 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -583,3 +583,24 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d } +#' Convert EML date/time format string to one that R can parse +#' +#' @param eml_format_string +#' +#' @return A date/time format string that can be parsed by `readr` or `strptime`. +#' @export +#' +#' @examples +#' convert_datetime_format("MM/DD/YYYY") +convert_datetime_format <- function(eml_format_string) { + r_format_string <- eml_format_string %>% + stringr::str_replace_all("YYYY", "%Y") %>% + stringr::str_replace_all("YY", "%y") %>% + stringr::str_replace_all("MMM", "%b") %>% + stringr::str_replace_all("MM", "%m") %>% + stringr::str_replace_all("DD", "%d") %>% + stringr::str_replace_all("(hh)|(HH)", "%H") %>% + stringr::str_replace_all("mm", "%M") %>% + stringr::str_replace_all("(ss)|(SS)", "%S") + + return(r_format_string) diff --git a/man/convert_datetime_format.Rd b/man/convert_datetime_format.Rd new file mode 100644 index 0000000..7ab696f --- /dev/null +++ b/man/convert_datetime_format.Rd @@ -0,0 +1,20 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{convert_datetime_format} +\alias{convert_datetime_format} +\title{Convert EML date/time format string to one that R can parse} +\usage{ +convert_datetime_format(eml_format_string) +} +\arguments{ +\item{eml_format_string}{} +} +\value{ +A date/time format string that can be parsed by \code{readr} or \code{strptime}. +} +\description{ +Convert EML date/time format string to one that R can parse +} +\examples{ +convert_datetime_format("MM/DD/YYYY") +} From 7e2ce10c8948ad3644c89ec20c6a4f324be6ac71 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 4 Nov 2022 17:53:14 -0600 Subject: [PATCH 21/60] Update documentation for convert_datetime_format --- R/tabular_data_congruence.R | 7 +++++-- man/convert_datetime_format.Rd | 8 ++++++-- 2 files changed, 11 insertions(+), 4 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 0d5faaa..8e8ba94 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -585,13 +585,16 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d #' Convert EML date/time format string to one that R can parse #' -#' @param eml_format_string +#' @details This is not a sophisticated function. If the EML format string is not valid, it will happily and without complaint return an R format string that will break your code. You have been warned. #' -#' @return A date/time format string that can be parsed by `readr` or `strptime`. +#' @param eml_format_string A character vector of EML date/time format strings. This function understands the following codes: YYYY = four digit year, YY = two digit year, MMM = three letter month abbrev., MM = two digit month, DD = two digit day, hh or HH = 24 hour time, mm = minutes, ss or SS = seconds. +#' +#' @return A character vector of date/time format strings that can be parsed by `readr` or `strptime`. #' @export #' #' @examples #' convert_datetime_format("MM/DD/YYYY") +#' convert_datetime_format(c("MM/DD/YYYY", "YY-MM-DD")) convert_datetime_format <- function(eml_format_string) { r_format_string <- eml_format_string %>% stringr::str_replace_all("YYYY", "%Y") %>% diff --git a/man/convert_datetime_format.Rd b/man/convert_datetime_format.Rd index 7ab696f..f61cca0 100644 --- a/man/convert_datetime_format.Rd +++ b/man/convert_datetime_format.Rd @@ -7,14 +7,18 @@ convert_datetime_format(eml_format_string) } \arguments{ -\item{eml_format_string}{} +\item{eml_format_string}{A character vector of EML date/time format strings. This function understands the following codes: YYYY = four digit year, YY = two digit year, MMM = three letter month abbrev., MM = two digit month, DD = two digit day, hh or HH = 24 hour time, mm = minutes, ss or SS = seconds.} } \value{ -A date/time format string that can be parsed by \code{readr} or \code{strptime}. +A character vector of date/time format strings that can be parsed by \code{readr} or \code{strptime}. } \description{ Convert EML date/time format string to one that R can parse } +\details{ +This is not a sophisticated function. If the EML format string is not valid, it will happily and without complaint return an R format string that will break your code. You have been warned. +} \examples{ convert_datetime_format("MM/DD/YYYY") +convert_datetime_format(c("MM/DD/YYYY", "YY-MM-DD")) } From 8bba851f4594c9039315c8d69cdbec7070143baf Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 4 Nov 2022 17:54:45 -0600 Subject: [PATCH 22/60] Improvements to test_date_range It still has issues. Doesn't handle year-only columns gracefully. --- R/tabular_data_congruence.R | 8 ++++++-- 1 file changed, 6 insertions(+), 2 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 8e8ba94..bf2ce46 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -536,14 +536,17 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # Get format string for each date/time column and filter out anything that doesn't have a year associated with it dttm_formats <- dttm_attrs[[data_file]]$formatString dttm_col_names <- dttm_col_names[grepl("Y", dttm_formats)] - dttm_formats <- dttm_formats[grepl("Y", dttm_formats)] + # Convert date/time formats to be compatible with R, and put them in a list so we can use do.call(cols) + dttm_formats <- as.list(convert_datetime_format(dttm_formats[grepl("Y", dttm_formats)])) + dttm_formats <- lapply(dttm_formats, readr::col_datetime) + names(dttm_formats) <- dttm_col_names # Read date/time columns, find max/min, and compare with max and min dates in metadata na_strings <- c("", "NA") if ("missingValueCode" %in% names(dttm_attrs[[data_file]])) { na_strings <- c(na_strings, unique(dttm_attrs[[data_file]]$missingValueCode)) } - dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = readr::cols(.default = readr::col_datetime()), show_col_types = FALSE)) + dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_formats), show_col_types = FALSE)) out_of_range <- sapply(names(dttm_data), function(col) { col_data <- dttm_data[[col]] if (all(is.na(col_data))) { @@ -607,3 +610,4 @@ convert_datetime_format <- function(eml_format_string) { stringr::str_replace_all("(ss)|(SS)", "%S") return(r_format_string) +} From f69271ba668e1b5a584130e33c1fe8c33158d19d Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 8 Nov 2022 17:09:31 -0700 Subject: [PATCH 23/60] Update authors/contributors --- DESCRIPTION | 10 ++++++---- man/DPchecker-package.Rd | 16 ++++++++++++++++ 2 files changed, 22 insertions(+), 4 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 7b5712d..0f43f66 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,10 +1,12 @@ Package: DPchecker Title: Checks Data Packages for Congruence Version: 0.0.0.9000 -Author: - person("Rob", "Baker", , "robert_baker@nps.gov", role = c("aut", "cre"), - comment = c(ORCID = "0000-0001-7591-5035")) -Maintainer: rob baker +Authors@R: c( + person("Rob", "Baker", email = "robert_baker@nps.gov", role = "cre"), + person("Rob", "Baker", email = "robert_baker@nps.gov", role = "aut", comment = c(ORCID = "0000-0001-7591-5035")), + person(c("Sarah", "E."), "Wright", email = "sarah_wright@nps.gov", role = "aut"), + person("Issac", "Quevedo", role = "ctb"), + person("Amelia", "Sherman", role = "ctb")) Description: Allows the user (and reviewer) to check a data package and test whether it meets the congruence standards set forth by NPS for upload to DataStore as a datapackage. License: MIT + file LICENSE Encoding: UTF-8 diff --git a/man/DPchecker-package.Rd b/man/DPchecker-package.Rd index 8d15a0f..ee5313f 100644 --- a/man/DPchecker-package.Rd +++ b/man/DPchecker-package.Rd @@ -7,5 +7,21 @@ \title{DPchecker: Checks Data Packages for Congruence} \description{ Allows the user (and reviewer) to check a data package and test whether it meets the congruence standards set forth by NPS for upload to DataStore as a datapackage. +} +\author{ +\strong{Maintainer}: Rob Baker \email{robert_baker@nps.gov} + +Authors: +\itemize{ + \item Rob Baker \email{robert_baker@nps.gov} (\href{https://orcid.org/0000-0001-7591-5035}{ORCID}) + \item Sarah E. Wright \email{sarah_wright@nps.gov} +} + +Other contributors: +\itemize{ + \item Issac Quevedo [contributor] + \item Amelia Sherman [contributor] +} + } \keyword{internal} From c47d4fd986131ce8b186ca3546642ffd3718d310 Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 8 Nov 2022 17:11:17 -0700 Subject: [PATCH 24/60] Update test_date_range It now behaves nicely for columns that are year only or year/month only --- DESCRIPTION | 3 ++- R/tabular_data_congruence.R | 40 ++++++++++++++++++++++--------------- 2 files changed, 26 insertions(+), 17 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 0f43f66..24ed2e3 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -22,4 +22,5 @@ Imports: EML, readr, magrittr, - tidyselect + tidyselect, + lubridate diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index bf2ce46..a12c630 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -527,7 +527,7 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # For each csv table, check that date/time columns are consistent with temporal coverage in metadata. List out tables and columns that are not in compliance. data_files <- list.files(path = directory, pattern = ".csv") - data_out_of_range <- sapply(data_files, function(data_file) { + dataset_out_of_range <- sapply(data_files, function(data_file) { dttm_col_names <- dttm_attrs[[data_file]]$attributeName # If the table doesn't have any date/time columns listed in the metadata, it automatically passes if (length(dttm_col_names) == 0) { @@ -537,8 +537,9 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d dttm_formats <- dttm_attrs[[data_file]]$formatString dttm_col_names <- dttm_col_names[grepl("Y", dttm_formats)] # Convert date/time formats to be compatible with R, and put them in a list so we can use do.call(cols) - dttm_formats <- as.list(convert_datetime_format(dttm_formats[grepl("Y", dttm_formats)])) - dttm_formats <- lapply(dttm_formats, readr::col_datetime) + dttm_formats_r <- as.list(convert_datetime_format(dttm_formats[grepl("Y", dttm_formats)])) %>% + lapply(readr::col_datetime) + names(dttm_formats_r) <- dttm_col_names names(dttm_formats) <- dttm_col_names # Read date/time columns, find max/min, and compare with max and min dates in metadata @@ -546,23 +547,30 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d if ("missingValueCode" %in% names(dttm_attrs[[data_file]])) { na_strings <- c(na_strings, unique(dttm_attrs[[data_file]]$missingValueCode)) } - dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_formats), show_col_types = FALSE)) - out_of_range <- sapply(names(dttm_data), function(col) { + dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_formats_r), show_col_types = FALSE)) + tbl_out_of_range <- sapply(names(dttm_data), function(col) { col_data <- dttm_data[[col]] if (all(is.na(col_data))) { return(paste(col, "(failed to parse)")) } max_date <- max(col_data, na.rm = TRUE) min_date <- min(col_data, na.rm = TRUE) - if (max_date > meta_end_date || min_date < meta_begin_date) { - return(paste0(col, " [", min_date, ", ", max_date, "]")) # column name and actual date range - } else { - return(NULL) + format_str_r <- dttm_formats_r[col] + bad_cols <- NULL + + # Compare years first, and only compare months and days if they are included in the format string + if (lubridate::year(max_date) > lubridate::year(meta_end_date) || lubridate::year(min_date) < lubridate::year(meta_begin_date)) { + bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") # column name and actual date range + } else if (grepl("%m", format_str_r) && (lubridate::month(max_date) > lubridate::month(meta_end_date) || lubridate::month(min_date) < lubridate::month(meta_begin_date))) { + bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") + } else if (grepl("%d", format_str_r) && (lubridate::day(max_date) > lubridate::day(meta_end_date) || lubridate::day(min_date) < lubridate::day(meta_begin_date))) { + bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") } + return(bad_cols) }, simplify = FALSE, USE.NAMES = TRUE) - out_of_range <- purrr::discard(out_of_range, is.null) - if (length(names(out_of_range)) > 0) { - return(paste(out_of_range, collapse = ", ")) # List out of range date columns + tbl_out_of_range <- purrr::discard(tbl_out_of_range, is.null) + if (length(names(tbl_out_of_range)) > 0) { + return(paste(tbl_out_of_range, collapse = ", ")) # List out of range date columns } else { return(NULL) } @@ -570,12 +578,12 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d USE.NAMES = TRUE, simplify = FALSE) # This will be null unless supposedly numeric columns read in as non-numeric - data_out_of_range <- purrr::discard(data_out_of_range, is.null) - data_out_of_range <- unlist(data_out_of_range) + dataset_out_of_range <- purrr::discard(dataset_out_of_range, is.null) + dataset_out_of_range <- unlist(dataset_out_of_range) # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test - if (!is.null(data_out_of_range)) { - msg <- paste0(names(data_out_of_range), ": ", data_out_of_range, collapse = "\n") + if (!is.null(dataset_out_of_range)) { + msg <- paste0(names(dataset_out_of_range), ": ", dataset_out_of_range, collapse = "\n") msg <- paste0("The following date/time columns are out of the range [", meta_begin_date, ", ", meta_end_date, "] specified in the metadata:\n", msg) stop(msg) } else { From 2cba090d113242b07b4e407efa0e4e8ceb696d14 Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 8 Nov 2022 17:11:34 -0700 Subject: [PATCH 25/60] Update temporary testing script --- run_all_tests.R | 2 ++ 1 file changed, 2 insertions(+) diff --git a/run_all_tests.R b/run_all_tests.R index f9c1d86..8e2b521 100644 --- a/run_all_tests.R +++ b/run_all_tests.R @@ -1,5 +1,6 @@ dirs <- list.dirs(here::here("scratchpad")) dirs <- dirs[-1] # get rid of root dir +dirs <- dirs[grepl("(BICY)|(BUIS)", dirs)] # Just test with new BICY and BUIS datasets for now for (dir in dirs) { cat(paste(crayon::blue$bold(basename(dir)), "\n")) @@ -18,6 +19,7 @@ for (dir in dirs) { try(test_file_name_match(dir, meta)) try(test_fields_match(dir, meta)) try(test_numeric_fields(dir, meta)) + try(test_date_range(dir, meta)) } cat("\n") From 0dc79d0a06b4e760d5aa3a823497d34a0a1a8eae Mon Sep 17 00:00:00 2001 From: Wright Date: Tue, 8 Nov 2022 17:52:55 -0700 Subject: [PATCH 26/60] Refactoring --- R/tabular_data_congruence.R | 20 +++++++++++++------- man/test_date_range.Rd | 2 +- 2 files changed, 14 insertions(+), 8 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index a12c630..772c0fe 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -173,7 +173,7 @@ test_header_num <- function(metadata = load_metadata(here::here())) { wrong_headers <- paste0(" ", names(wrong_headers), ": ", wrong_headers, collapse = "\n") stop(paste0("Metadata indicates that the following data files do not contain either zero or more than one header row:\n", wrong_headers)) } else { - message("PASSED header Check: Metadata indicates that each data file contains exactly one header row") + message("PASSED header check: Metadata indicates that each data file contains exactly one header row") } return(invisible(metadata)) @@ -349,7 +349,7 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata # Quick check that tables match if (!(all(names(data_colnames) %in% names(metadata_attrs)) & all(names(metadata_attrs) %in% names(data_colnames)))) { - stop("Mismatch in data filenames and files listed in metadata. Call `test_file_name_match()` for more info.") + stop("Mismatch in data filenames and files listed in metadata. You must resolve this issue before you can verify that fields match. Call `test_file_name_match()` for more info.") } # Check each CSV. If column and attributes are a mismatch, describe the issue @@ -480,7 +480,7 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada #' #' @description test_date_range verifies that dates in the dataset are consistent with the date range in the metadata. #' -#' @details Currently, this function operates on the assumption that the dates and times in your dataset are stored in a valid ISO format. If your dates/times are in a different format, this function may behave unpredictably. +#' @details This function checks columns that are identified as date/time in the metadata. It throws a warning if the dates contained in the columns are outside of the temporal coverage specified in the metadata. If the date/time format string specified in the metadata does not match the actual format of the date in the CSV, it will likely fail to parse and throw an error. #' #' @inheritParams load_data #' @inheritParams test_metadata_version @@ -505,14 +505,15 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d meta_end_date <- readr::parse_datetime(EMLeditor::get.endDate(metadata), format = "%d %B %Y") meta_date_range <- c(begin = meta_begin_date, end = meta_end_date) - # Check if temporal coverage info is complete + # Check if temporal coverage info is complete. Throw a warning if it's missing entirely and an error if it's only partially complete. + # The logic being that maybe there's a scenario where temporal coverage isn't relevant to the dataset at all, but if it has date/time info, it has to have both a start and end. if (all(is.na(meta_date_range))) { warning("Metadata does not contain temporal coverage information.") return(metadata) } else if (any(is.na(meta_date_range))) { missing_date <- names(meta_date_range[is.na(meta_date_range)]) present_date <- names(meta_date_range[!is.na(meta_date_range)]) - warning(paste("Metadata temporal coverage is missing", missing_date, "date. This test will still check data against", present_date, "date.")) + stop(paste("Metadata temporal coverage is missing", missing_date, "date.")) } # Get list of date/time attributes for each table in the metadata @@ -583,9 +584,14 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test if (!is.null(dataset_out_of_range)) { - msg <- paste0(names(dataset_out_of_range), ": ", dataset_out_of_range, collapse = "\n") + msg <- paste0("\t", names(dataset_out_of_range), ": ", dataset_out_of_range, collapse = "\n") msg <- paste0("The following date/time columns are out of the range [", meta_begin_date, ", ", meta_end_date, "] specified in the metadata:\n", msg) - stop(msg) + if (grepl("failed to parse", msg)) { + stop(msg) # Throw an error if some dates won't parse + } else { + warning(msg) # If dates all parse but are out of range, just throw a warning. + } + } else { message("PASSED: Columns indicated as date/time in metadata are within the stated temporal coverage range.") } diff --git a/man/test_date_range.Rd b/man/test_date_range.Rd index 2a4d30f..305edf7 100644 --- a/man/test_date_range.Rd +++ b/man/test_date_range.Rd @@ -18,7 +18,7 @@ Invisibly returns \code{metadata}. test_date_range verifies that dates in the dataset are consistent with the date range in the metadata. } \details{ -Currently, this function operates on the assumption that the dates and times in your dataset are stored in a valid ISO format. If your dates/times are in a different format, this function may behave unpredictably. +This function checks columns that are identified as date/time in the metadata. It throws a warning if the dates contained in the columns are outside of the temporal coverage specified in the metadata. If the date/time format string specified in the metadata does not match the actual format of the date in the CSV, it will likely fail to parse and throw an error. } \examples{ test_date_range() From 8aaa61e8b5cf35aaa77c339ffc086ccd3eef09c5 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 14 Nov 2022 17:57:38 -0700 Subject: [PATCH 27/60] Fixes to test_date_range --- R/tabular_data_congruence.R | 8 ++++++-- 1 file changed, 6 insertions(+), 2 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 772c0fe..6a1e051 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -536,10 +536,14 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d } # Get format string for each date/time column and filter out anything that doesn't have a year associated with it dttm_formats <- dttm_attrs[[data_file]]$formatString + dttm_formats <- dttm_formats[grepl("Y", dttm_formats)] dttm_col_names <- dttm_col_names[grepl("Y", dttm_formats)] # Convert date/time formats to be compatible with R, and put them in a list so we can use do.call(cols) - dttm_formats_r <- as.list(convert_datetime_format(dttm_formats[grepl("Y", dttm_formats)])) %>% + dttm_formats_r <- convert_datetime_format(dttm_formats) + dttm_col_spec <- dttm_formats_r %>% + as.list() %>% lapply(readr::col_datetime) + names(dttm_col_spec) <- dttm_col_names names(dttm_formats_r) <- dttm_col_names names(dttm_formats) <- dttm_col_names @@ -548,7 +552,7 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d if ("missingValueCode" %in% names(dttm_attrs[[data_file]])) { na_strings <- c(na_strings, unique(dttm_attrs[[data_file]]$missingValueCode)) } - dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_formats_r), show_col_types = FALSE)) + dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_col_spec), show_col_types = FALSE)) tbl_out_of_range <- sapply(names(dttm_data), function(col) { col_data <- dttm_data[[col]] if (all(is.na(col_data))) { From a4b68dcecde480310552464106b2fec9cc419e61 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 14 Nov 2022 17:59:05 -0700 Subject: [PATCH 28/60] Use cli package to format messages/warnings/errors --- R/tabular_data_congruence.R | 142 +++++++++++++++++++----------------- 1 file changed, 77 insertions(+), 65 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 6a1e051..ef07f44 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -26,22 +26,24 @@ load_metadata <- function(directory = here::here()) { TRUE ~ "UNKNOWN") # Read metadata if (metaformat == "fgdc") { - stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) + # stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) + cli::cli_abort(c("x" = "Congruence checking is not yet supported for {metaformat} metadata.")) } else if (metaformat == "ISO19915") { - stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) + # stop(paste0("\nCongruence checking is not yet supported for ", metaformat, " metadata.")) + cli::cli_abort(c("x" = "Congruence checking is not yet supported for {metaformat} metadata.")) } else if (metaformat == "eml") { metadata <- EML::read_eml(metadata_file, from = "xml") if (is.null(metadata)) { - stop("Could not load metadata.") + cli::cli_abort(c("x" = "Could not load metadata.")) } else { - message(paste0("PASSED: Metadata check passed. EML metadata (", crayon::blue$bold(metadata_file), ") found and loaded into R.")) + message(cli::cli_inform(c("v" = "Metadata check passed. EML metadata {.file {metadata_file}} found and loaded into R."))) } } } else if (length(metadata_file) < 1) { # if no metadata file exists, stop the function and warn the user - stop("Metadata check failed. No metadata found. Your metadata file name must end in _metadata.xml.\n") + cli::cli_abort(c("x" = "Metadata check failed. No metadata found. Your metadata file name must end in {.file _metadata.xml}.")) } else if (length(metadata_file) > 1) { # if multiple metadata files exist, stop the function and warn the user - stop("Metadata check failed. The data package format only allows one metadata file per data package. Please remove extraneous metadata files or combine them into a single file.\n") + cli::cli_abort(c("x" = "Metadata check failed. The data package format only allows one metadata file per data package. Please remove extraneous metadata files or combine them into a single file.")) } return(metadata) @@ -89,9 +91,9 @@ test_metadata_version <- function(metadata = load_metadata(here::here())) { vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", metadata)[1], 1, 5) vers <- numeric_version(vers) if (vers < "2.2.0") { - stop(paste("Unsupported EML version: EML must be 2.2.0 or later. Your version is", vers)) + cli::cli_abort(c("x" = "Unsupported EML version: EML must be 2.2.0 or later. Your version is {.val {vers}}.")) } else { # vers >= 2.2.0 - message(paste0("PASSED: Your EML version (", vers, ") is supported.")) + cli::cli_inform(c("v" = "Your EML version {.val {vers}} is supported.")) } return(invisible(metadata)) @@ -115,10 +117,19 @@ test_validate_schema <- function(metadata = load_metadata(here::here())) { val <- EML::eml_validate(metadata) if (val == TRUE) { - message("PASSED: Your metadata is schema valid.") + cli::cli_inform(c("v" = "Your metadata is schema valid.")) } else { attribs <- attributes(val) - stop(paste0("Your is metadata is schema-invalid.\n", attribs)) + issues <- c() + if ("errors" %in% names(attribs)) { + names(attribs$errors) <- rep("x", length(attribs$errors)) + issues <- c(issues, attribs$errors) + } + if ("warnings" %in% names(attribs)) { + names(attribs$warnings) <- rep("!", length(names(attribs$warnings))) + issues <- c(issues, attribs$warnings) + } + cli::cli_abort(c("Your metadata is schema-invalid. See output from {.fn EML::eml_validate} below.", issues)) } return(invisible(metadata)) @@ -140,9 +151,9 @@ test_validate_schema <- function(metadata = load_metadata(here::here())) { test_footer <- function(metadata = load_metadata(here::here())) { if (is.null(arcticdatautils::eml_get_simple(metadata, "numFooterLines"))) { - message("PASSED: Metadata indicates data files do not have footers.\n") + cli::cli_inform(c("v" = "Metadata indicates data files do not have footers.")) } else { - stop("Metadata indicates that data files include footers. Please remove all footers from data files.") + cli::cli_abort(c("x" = "Metadata indicates that data files include footers. Please remove all footers from data files.")) } return(invisible(metadata)) @@ -167,13 +178,14 @@ test_header_num <- function(metadata = load_metadata(here::here())) { header <- arcticdatautils::eml_get_simple(metadata, "numHeaderLines") names(header) <- arcticdatautils::eml_get_simple(metadata, "entityName") if (is.null(header)) { - stop("Metadata does not contain information about number of header rows") + cli::cli_abort(c("x" = "Metadata does not contain information about number of header rows")) } else if (any(header != "1")) { wrong_headers <- header[header != "1"] - wrong_headers <- paste0(" ", names(wrong_headers), ": ", wrong_headers, collapse = "\n") - stop(paste0("Metadata indicates that the following data files do not contain either zero or more than one header row:\n", wrong_headers)) + wrong_headers <- paste0(names(wrong_headers), ": ", wrong_headers) + names(wrong_headers) <- rep("*", length(wrong_headers)) + cli::cli_abort(c("x" = "Metadata indicates that the following data files contain either zero or more than one header row:", wrong_headers)) } else { - message("PASSED header check: Metadata indicates that each data file contains exactly one header row") + cli::cli_inform(c("v" = "Metadata indicates that each data file contains exactly one header row.")) } return(invisible(metadata)) @@ -200,10 +212,11 @@ test_delimiter <- function(metadata = load_metadata(here::here())) { stop("Metadata does not contain information about the field delimiter for data files") } else if (any(nchar(delimit) != 1)) { wrong_delimiters <- delimit[nchar(delimit) != 1] - wrong_delimiters <- paste0(" ", names(wrong_delimiters), collapse = "\n") - stop(paste0("Metadata indicates that the following data files do not contain valid delimiters:\n", wrong_delimiters)) + wrong_delimiters <- names(wrong_delimiters) + names(wrong_delimiters) <- rep("*", length(wrong_delimiters)) + cli::cli_abort(c("x" = "Metadata indicates that the following data files do not contain valid delimiters:", wrong_delimiters)) } else { - message("PASSED: field delimiter check passed: Metadata indicates that each data file contains a field delimiter that is a single character") + cli::cli_inform(c("v" = "Metadata indicates that each data file contains a field delimiter that is a single character")) } return(invisible(metadata)) @@ -235,9 +248,10 @@ test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { # if no duplicates, test passed: if (length(dups) == 0) { - message("PASSED: Each data file name is used exactly once in the metadata file.") + cli::cli_inform(c("v" = "Each data file name is used exactly once in the metadata file.")) } else if (length(dups > 0)) { # if duplicates, test failed: - stop(paste0("Metadata file name check failed. Some filenames are used more than once in the metadata:\n", crayon::red$bold(dups))) + names(dups) <- "*" + cli::cli_abort(c("x" = "Metadata file name check failed. Some filenames are used more than once in the metadata:", dups)) } @@ -265,10 +279,10 @@ test_dup_data_files <- function(directory = here::here()) { dups <- data_files[duplicated(data_files)] # if no duplicates, test passed: if (length(dups) == 0) { - message("PASSED: Each data file name is used exactly once.") + cli::cli_inform(c("v" = "Each data file name is used exactly once.")) } else if (length(dups > 0)) { # if duplicates, test failed: - dups_msg <- paste0("The following data filenames are duplicated:\n", dups) - stop(paste0("Data file name check failed. Some filenames are used more than once.\n", dups_msg)) + names(dups) <- "*" + cli::cli_abort(c("x" = "Data file name check failed. Some filenames are used more than once.", dups_msg)) } return(invisible(data_files)) } @@ -303,13 +317,12 @@ test_file_name_match <- function(directory = here::here(), metadata = load_metad dir_only <- setdiff(files_in_dir, files_in_metadata) if (length(meta_only) == 0 && length(dir_only) == 0) { - message("PASSED: file name congruence check. All data files are listed in metadata and all metadata files names refer to data files.") + cli::cli_inform(c("v" = "All data files are listed in metadata and all metadata files names refer to data files.")) } else if (length(meta_only) > 0 || length(dir_only) > 0) { - meta_txt <- paste("\n", crayon::red$bold(meta_only), collapse = "") - dat_txt <- paste("\n", crayon::red$bold(dir_only), collapse = "") - msg <- paste0(length(meta_only), " files listed in metadata and missing from data folder", meta_txt, - "\n", length(dir_only), " files present in data folder and missing from metadata", dat_txt) - stop(msg) + names(meta_only) <- "*" + names(dir_only) <- "*" + cli::cli_abort(c("x" = "{length(meta_only)} file{?s} listed in metadata and missing from data folder", meta_only, + "x" = "{length(dir_only)} file{?s} present in data folder and missing from metadata", dir_only)) } return(invisible(metadata)) @@ -349,7 +362,7 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata # Quick check that tables match if (!(all(names(data_colnames) %in% names(metadata_attrs)) & all(names(metadata_attrs) %in% names(data_colnames)))) { - stop("Mismatch in data filenames and files listed in metadata. You must resolve this issue before you can verify that fields match. Call `test_file_name_match()` for more info.") + cli::cli_abort(c("x" = "Mismatch in data filenames and files listed in metadata. You must resolve this issue before you can verify that fields match. Call {.fn test_file_name_match} for more info.")) } # Check each CSV. If column and attributes are a mismatch, describe the issue @@ -359,23 +372,22 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata if (length(meta_cols) == length(data_cols) && all(meta_cols == data_cols)) { # Columns match and are in right order return(NULL) } else if (all(meta_cols %in% data_cols) && all(data_cols %in% meta_cols)) { # Columns match and are in wrong order - return("Metadata column order does not match data column order") + return(c(" " = paste0("--> ", data_file, ": Metadata column order does not match data column order"))) } else { # Columns don't match - missing_from_meta <- paste(data_cols[!(data_cols %in% meta_cols)], collapse = ", ") - missing_from_data <- paste(meta_cols[!(meta_cols %in% data_cols)], collapse = ", ") - if (missing_from_meta != "") { - missing_from_meta <- paste0("Data column(s) ", crayon::red$bold(missing_from_meta), " missing from metadata") - } else { - missing_from_meta <- NULL + missing_from_meta <- data_cols[!(data_cols %in% meta_cols)] + if (length(missing_from_meta) > 0) { + missing_from_meta <- paste0("----Missing from metadata: ", paste0("{.field ", missing_from_meta, "}", collapse = ", ")) + names(missing_from_meta) <- " " } - if (missing_from_data != "") { - missing_from_data <- paste0("Metadata column(s) ", crayon::red$bold(missing_from_data), " missing from data") - } else { - missing_from_data <- NULL + missing_from_data <- meta_cols[!(meta_cols %in% data_cols)] + if (length(missing_from_data) > 0) { + missing_from_data <- paste0("----Missing from data file: ", paste0("{.field ", missing_from_data, "}", collapse = ", ")) + names(missing_from_data) <- " " } - return(paste0(paste(c(missing_from_data, missing_from_meta), collapse = ". "), ".")) + msg <- c(" " = paste0("--> {.file ", data_file, "}:"), missing_from_meta, missing_from_data) + return(msg) } - }, USE.NAMES = TRUE, simplify = FALSE) + }, USE.NAMES = FALSE, simplify = FALSE) # Remove tables from list that pass the test, and convert it to a named vector mismatches <- purrr::discard(mismatches, is.null) %>% @@ -383,11 +395,9 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata # If there are mismatches, throw an error, otherwise, print a message indicating passed test if (!is.null(mismatches)) { - msg <- paste0(names(mismatches), ": ", mismatches, collapse = "\n") - msg <- paste("Field mismatch between data and metadata:\n", msg) - stop(msg) + cli::cli_abort(c("x" = "Column mismatch between data and metadata.", mismatches)) } else { - message("PASSED: fields match. All columns in data files are listed in metadata and all attributes in metadata are columns in the data files.") + cli::cli_inform(c("v" = "All columns in data match all columns in metadata.")) } return(invisible(metadata)) @@ -453,7 +463,7 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada }, simplify = FALSE, USE.NAMES = TRUE) non_numeric <- purrr::discard(non_numeric, is.null) if (length(names(non_numeric)) > 0) { - return(paste(names(non_numeric), collapse = ", ")) # List non-numeric columns + return(paste0("{.field ", non_numeric, "}", collapse = ", ")) # List non-numeric columns } else { return(NULL) } @@ -466,11 +476,12 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test if (!is.null(data_non_numeric)) { - msg <- paste0(names(data_non_numeric), ": ", data_non_numeric, collapse = "\n") - msg <- paste("Columns indicated as numeric in metadata contain non-numeric values:\n", msg) - stop(msg) + msg <- paste0("--> {.file ", names(data_non_numeric), "}: ", data_non_numeric) + names(msg) <- " " + msg <- c("x" = "Columns indicated as numeric in metadata contain non-numeric values:", msg) + cli::cli_abort(msg) } else { - message("PASSED: Columns indicated as numeric in metadata contain only numeric values and valid missing value codes.") + cli::cli_inform(c("v" = "Columns indicated as numeric in metadata contain only numeric values and valid missing value codes.")) } return(invisible(metadata)) @@ -508,12 +519,12 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # Check if temporal coverage info is complete. Throw a warning if it's missing entirely and an error if it's only partially complete. # The logic being that maybe there's a scenario where temporal coverage isn't relevant to the dataset at all, but if it has date/time info, it has to have both a start and end. if (all(is.na(meta_date_range))) { - warning("Metadata does not contain temporal coverage information.") + cli::cli_warn(c("!" = "Metadata does not contain temporal coverage information.")) return(metadata) } else if (any(is.na(meta_date_range))) { missing_date <- names(meta_date_range[is.na(meta_date_range)]) present_date <- names(meta_date_range[!is.na(meta_date_range)]) - stop(paste("Metadata temporal coverage is missing", missing_date, "date.")) + cli::cli_warn(c("!" = paste("Metadata temporal coverage is missing", missing_date, "date."))) } # Get list of date/time attributes for each table in the metadata @@ -556,7 +567,7 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d tbl_out_of_range <- sapply(names(dttm_data), function(col) { col_data <- dttm_data[[col]] if (all(is.na(col_data))) { - return(paste(col, "(failed to parse)")) + return(paste0("{.field ", col, "} (failed to parse)")) } max_date <- max(col_data, na.rm = TRUE) min_date <- min(col_data, na.rm = TRUE) @@ -565,11 +576,11 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # Compare years first, and only compare months and days if they are included in the format string if (lubridate::year(max_date) > lubridate::year(meta_end_date) || lubridate::year(min_date) < lubridate::year(meta_begin_date)) { - bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") # column name and actual date range + bad_cols <- paste0("{.field ", col, "} [{.val ", format(min_date, format_str_r), "}, {.val ", format(max_date, format_str_r), "}]") # column name and actual date range } else if (grepl("%m", format_str_r) && (lubridate::month(max_date) > lubridate::month(meta_end_date) || lubridate::month(min_date) < lubridate::month(meta_begin_date))) { - bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") + bad_cols <- paste0("{.field ", col, "} [{.val ", format(min_date, format_str_r), "}, {.val ", format(max_date, format_str_r), "}]") # column name and actual date range } else if (grepl("%d", format_str_r) && (lubridate::day(max_date) > lubridate::day(meta_end_date) || lubridate::day(min_date) < lubridate::day(meta_begin_date))) { - bad_cols <- paste0(col, " [", format(min_date, format_str_r), ", ", format(max_date, format_str_r), "]") + bad_cols <- paste0("{.field ", col, "} [{.val ", format(min_date, format_str_r), "}, {.val ", format(max_date, format_str_r), "}]") # column name and actual date range } return(bad_cols) }, simplify = FALSE, USE.NAMES = TRUE) @@ -588,16 +599,17 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d # If numeric cols contain non-numeric values, throw an error, otherwise, print a message indicating passed test if (!is.null(dataset_out_of_range)) { - msg <- paste0("\t", names(dataset_out_of_range), ": ", dataset_out_of_range, collapse = "\n") - msg <- paste0("The following date/time columns are out of the range [", meta_begin_date, ", ", meta_end_date, "] specified in the metadata:\n", msg) - if (grepl("failed to parse", msg)) { - stop(msg) # Throw an error if some dates won't parse + msg <- paste0("--> {.file ", names(dataset_out_of_range), "}: ", dataset_out_of_range) + names(msg) <- " " + err <- paste0("The following date/time columns are out of the range [{.val ", meta_begin_date, "}, {.val ", meta_end_date, "}] specified in the metadata:") + if (any(grepl("failed to parse", msg))) { + cli::cli_abort(c("x" = err, msg)) # Throw an error if some dates won't parse } else { - warning(msg) # If dates all parse but are out of range, just throw a warning. + cli::cli_warn(c("!" = err, msg)) # If dates all parse but are out of range, just throw a warning. } } else { - message("PASSED: Columns indicated as date/time in metadata are within the stated temporal coverage range.") + cli::cli_inform(c("v" = "Columns indicated as date/time in metadata are within the stated temporal coverage range.")) } return(invisible(metadata)) From 942b6bfcda359cd16d251541e197715ec7779b5a Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 18 Nov 2022 13:57:48 -0700 Subject: [PATCH 29/60] Add testthat framework --- tests/testthat.R | 12 ++++++++++++ 1 file changed, 12 insertions(+) create mode 100644 tests/testthat.R diff --git a/tests/testthat.R b/tests/testthat.R new file mode 100644 index 0000000..2219782 --- /dev/null +++ b/tests/testthat.R @@ -0,0 +1,12 @@ +# This file is part of the standard setup for testthat. +# It is recommended that you do not modify it. +# +# Where should you do additional test configuration? +# Learn more about the roles of various files in: +# * https://r-pkgs.org/tests.html +# * https://testthat.r-lib.org/reference/test_package.html#special-files + +library(testthat) +library(DPchecker) + +test_check("DPchecker") From 52315327a55b8063c8e8ca8a74fe1e559d8f3100 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 18 Nov 2022 14:42:56 -0700 Subject: [PATCH 30/60] Add imports --- DESCRIPTION | 9 ++++++++- 1 file changed, 8 insertions(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index 24ed2e3..b15d3d1 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -23,4 +23,11 @@ Imports: readr, magrittr, tidyselect, - lubridate + lubridate, + EMLeditor (>= 0.0.1.0), + cli, + dplyr, + purrr, + stringr +Remotes: + nationalparkservice/EMLeditor From 3c42285ff1e27d6fa638f76c61e4da5848abf8bb Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 18 Nov 2022 14:43:18 -0700 Subject: [PATCH 31/60] Fixes to load_metadata --- R/tabular_data_congruence.R | 5 +++-- 1 file changed, 3 insertions(+), 2 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index ef07f44..41fbc92 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -36,9 +36,10 @@ load_metadata <- function(directory = here::here()) { if (is.null(metadata)) { cli::cli_abort(c("x" = "Could not load metadata.")) } else { - message(cli::cli_inform(c("v" = "Metadata check passed. EML metadata {.file {metadata_file}} found and loaded into R."))) + cli::cli_inform(c("v" = "Metadata check passed. EML metadata {.file {metadata_file}} found and loaded into R.")) } - + } else { + cli::cli_abort(c("x" = "Could not determine metadata format.")) } } else if (length(metadata_file) < 1) { # if no metadata file exists, stop the function and warn the user cli::cli_abort(c("x" = "Metadata check failed. No metadata found. Your metadata file name must end in {.file _metadata.xml}.")) From 007ab42ce8893d04dc66da2fed54b26df1512cb6 Mon Sep 17 00:00:00 2001 From: Wright Date: Fri, 18 Nov 2022 14:43:34 -0700 Subject: [PATCH 32/60] Add tests for load_metadata --- ...POST-EDITOR) Example_BICY_Veg_metadata.xml | 16888 ++++++++++++++++ .../bad/BICY_good/Mini_BICY_Veg_Geography.csv | 1001 + .../Mini_BICY_Veg_Intercept_Cleaned.csv | 501 + .../Mini_BICY_Veg_Transect_Cleaned.csv | 501 + tests/testthat/bad/BUIS_good/BUIS_herps.csv | 47 + .../BUIS_herps_EMLeditor_metadata.xml | 1040 + tests/testthat/bad/README.txt | 1 + .../bad/multiple_xml/first_metadata.xml | 1040 + .../bad/multiple_xml/second_metadata.xml | 1040 + .../testthat/bad/no_metadata/bad_meatdata.xml | 0 .../testthat/bad/no_metadata/bad_metadata.txt | 0 .../unreadable_xml/unreadable_metadata.xml | 2 + .../wrong_meta_formats/fgdc/fgdc_metadata.xml | 1 + .../wrong_meta_formats/iso/iso_metadata.xml | 1 + .../bad/wrong_meta_formats/weird_metadata.xml | 1 + ...POST-EDITOR) Example_BICY_Veg_metadata.xml | 16888 ++++++++++++++++ .../BICY_good/Mini_BICY_Veg_Geography.csv | 1001 + .../Mini_BICY_Veg_Intercept_Cleaned.csv | 501 + .../Mini_BICY_Veg_Transect_Cleaned.csv | 501 + tests/testthat/good/BUIS_good/BUIS_herps.csv | 47 + .../BUIS_herps_EMLeditor_metadata.xml | 1040 + tests/testthat/good/README.txt | 1 + tests/testthat/test-tabular_data_congruence.R | 39 + 23 files changed, 42082 insertions(+) create mode 100644 tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv create mode 100644 tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv create mode 100644 tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 tests/testthat/bad/BUIS_good/BUIS_herps.csv create mode 100644 tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml create mode 100644 tests/testthat/bad/README.txt create mode 100644 tests/testthat/bad/multiple_xml/first_metadata.xml create mode 100644 tests/testthat/bad/multiple_xml/second_metadata.xml create mode 100644 tests/testthat/bad/no_metadata/bad_meatdata.xml create mode 100644 tests/testthat/bad/no_metadata/bad_metadata.txt create mode 100644 tests/testthat/bad/unreadable_xml/unreadable_metadata.xml create mode 100644 tests/testthat/bad/wrong_meta_formats/fgdc/fgdc_metadata.xml create mode 100644 tests/testthat/bad/wrong_meta_formats/iso/iso_metadata.xml create mode 100644 tests/testthat/bad/wrong_meta_formats/weird_metadata.xml create mode 100644 tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/good/BICY_good/Mini_BICY_Veg_Geography.csv create mode 100644 tests/testthat/good/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv create mode 100644 tests/testthat/good/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 tests/testthat/good/BUIS_good/BUIS_herps.csv create mode 100644 tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml create mode 100644 tests/testthat/good/README.txt create mode 100644 tests/testthat/test-tabular_data_congruence.R diff --git a/tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..10920ad --- /dev/null +++ b/tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -0,0 +1,16888 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv new file mode 100644 index 0000000..54c9029 --- /dev/null +++ b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Capparis flexuosa,"Limber caper, Bayleaf capertree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Eupatorium capillifolium,Dog-fennel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Laguncularia racemosa,White mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Hydrilla verticillata,Water-thyme,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Agalinis fasciculata,Beach false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Physostegia purpurea,"False dragonhead, Eastern false dragonhead",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Psidium guajava,Guava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,9,-81.2799,26.162496913975417,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Citrus sinensis,Sweet orange,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Piloblephis rigida,Wild pennyroyal,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Ardisia escallonioides,Marlberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Centrosema virginianum,Spurred butterfly-pea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-10,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-20,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-24,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Aristida beyrichiana,Southern wiregrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Scleria,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-06-03,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Bursera simaruba,Gumbo-limbo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Buttonwood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,74,-81.27757867329474,26.166855550671237,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Tripsacum dactyloides,"Eastern gamagrass, Fakahatchee grass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..756a8e2 --- /dev/null +++ b/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-04-24,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-03-03,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-02-20,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-07-11,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-01,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,1,260,704,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-07-31,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2002-05-17,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-02-26,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,2002-07-17,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-11-05,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-05-15,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-15,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-07-01,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-04-02,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-03-20,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-20,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2003-03-20,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2002-05-07,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-06-18,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-19,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-06,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,2002-04-09,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-03-25,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-04-17,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-11,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-03-19,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-06-04,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,2003-04-09,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2004-03-24,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,2003-02-05,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-11-15,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,2002-08-01,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2003-11-26,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-02-26,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-03-05,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2004-05-12,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-18,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2002-04-09,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-25,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-03-05,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-11,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,2004-03-11,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-02-25,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-05-20,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-06-18,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-12-20,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,2002-05-29,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2003-09-11,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-04-24,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-07-17,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2002-08-07,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2003-02-28,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,2003-09-11,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-23,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-03-20,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-21,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,2002-08-22,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-22,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2002-09-18,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-08-23,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2002-08-01,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-03-28,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-24,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-09,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-05-18,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2002-07-18,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,2004-06-24,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2003-03-11,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2002-06-05,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-02,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,2003-09-11,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-06-04,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-06-13,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-04-02,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,2003-02-20,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2003-02-27,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-05-26,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-06-13,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2004-06-17,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-03-25,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-11,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-17,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-03-31,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,2004-04-08,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-21,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-06-20,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-05-31,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-06-12,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-05-06,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2002-12-20,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,2003-03-18,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,2002-05-28,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-04-28,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-11-08,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-13,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-03-12,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2003-02-26,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-26,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,2004-04-01,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2004-03-17,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-05,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-02-04,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-29,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2004-03-26,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-03-25,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-06-03,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2003-05-14,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2003-09-16,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,2003-03-13,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-27,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-14,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-19,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-27,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,2004-05-20,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,2002-11-05,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,2003-05-23,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-04-14,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-03-06,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,2003-03-12,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-09,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2002-08-23,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-04-16,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-03-19,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-31,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-06-04,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-06-03,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-09,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-10,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,2002-05-20,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-23,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-22,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-10,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-05-24,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-05-22,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-07,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-28,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-09-17,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2004-05-07,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-29,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-08,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-06-12,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-22,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-11,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-13,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-27,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-18,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,2003-02-20,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-05-09,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-13,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-21,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-06-12,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-03-24,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,2002-05-09,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-29,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-05-22,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2002-05-07,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2004-05-07,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-03-04,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-04-29,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-12,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-07-31,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-01,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2004-04-01,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-17,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2004-04-06,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-05,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2004-06-01,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,2004-05-05,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,2003-05-23,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,2003-01-04,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-09-10,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2002-08-09,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,2003-05-03,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-05-31,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,2003-04-29,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-08,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-09-17,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2003-03-06,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-08-23,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-04,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-10-29,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2002-08-09,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,2002-11-08,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-02,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-02-21,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2002-10-31,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-29,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A diff --git a/tests/testthat/bad/BUIS_good/BUIS_herps.csv b/tests/testthat/bad/BUIS_good/BUIS_herps.csv new file mode 100644 index 0000000..daf92ae --- /dev/null +++ b/tests/testthat/bad/BUIS_good/BUIS_herps.csv @@ -0,0 +1,47 @@ +eventDate,eventDate_flag,lifeStage,sex,locality,recordedBy,verbatimCoordinateSystem,geodeticDatum,decimalLatitude,decimalLongitude,verbatimCoordinates,Point_ID,coordinateUncertaintyInMeters,coordinate_flag,catalogNumber,samplingProtocol,occurrenceRemarks,order,family,genus,specificEpithet,infraspecificEpithet,vernacularName,scientificName,scientificName_flag,establishmentMeans,eventRemarks,custom_SpeciesCode,custom_CaptureID,custom_SnoutToVentLengthInMm,custom_Substrate,custom_Collected,custom_SpecimenID,custom_CollectionDate,custom_SacrificeDate,custom_Fixative,custom_Preservative +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3396,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,2,16,NA,1,9,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3398,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,3,26,NA,1,11,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3397,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,4,20,NA,1,10,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789304107479747,-82.6232285973053,E 327939 N 1967620,3,20,A,BUIS 3393,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,5,27,NA,1,6,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78820833617135,-82.62134174481531,E 328138 N 1967497,5,20,A,BUIS 3395,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,6,24,NA,1,8,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790153112468364,-82.62653747081812,E 327589 N 1967717,4,20,A,BUIS 3394,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,7,20,NA,1,7,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3391,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,8,27,NA,1,4,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3388,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,9,17,NA,1,1,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3389,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,10,25,NA,1,2,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3392,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,11,14,NA,1,5,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3390,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,12,26,NA,1,3,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3414,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,13,58,NA,1,27,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3411,Opportunistic Encounter Survey,Right hind foot broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,14,46,NA,1,24,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3412,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,15,43,NA,1,25,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3413,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,16,49,NA,1,26,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3410,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,17,52,NA,1,23,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3409,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,18,59,NA,1,22,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.787949020721694,-82.62210338788441,E 328057 N 1967469,9,20,A,BUIS 3403,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,19,54,NA,1,16,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789456323873306,-82.62774788298215,E 327460 N 1967641,12,20,A,BUIS 3408,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,20,63,NA,1,21,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3402,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,21,43,NA,1,15,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3407,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,22,44,NA,1,20,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3401,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,23,46,NA,1,14,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3404,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,24,45,NA,1,17,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3406,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,25,56,NA,1,19,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3405,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,26,62,NA,1,18,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.785244256880826,-82.62355974989633,E 327900 N 1967171,6,20,A,BUIS 3399,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,27,50,NA,1,12,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.784889496549056,-82.62275484678544,E 327985 N 1967131,7,20,A,BUIS 3400,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,28,54,NA,1,13,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Juvenile,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,29,23,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,30,61,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,31,52,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,32,47,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,33,46,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,34,56,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,35,47,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,36,44,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,37,45,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,38,47,Acacia,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,39,48,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,40,62,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,41,50,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under wood litter,Sbe,42,31,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,43,29,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,44,32,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,45,60,Tree,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,46,57,Bare Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,47,63,Tree Leaf,0,29,NA,NA,NA,NA diff --git a/tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..0db4556 --- /dev/null +++ b/tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/README.txt b/tests/testthat/bad/README.txt new file mode 100644 index 0000000..2d9c166 --- /dev/null +++ b/tests/testthat/bad/README.txt @@ -0,0 +1 @@ +WARNING: All datasets in this folder were created and modified for the sole purpose of testing. Do not use these datasets for scientific purposes. \ No newline at end of file diff --git a/tests/testthat/bad/multiple_xml/first_metadata.xml b/tests/testthat/bad/multiple_xml/first_metadata.xml new file mode 100644 index 0000000..0db4556 --- /dev/null +++ b/tests/testthat/bad/multiple_xml/first_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/multiple_xml/second_metadata.xml b/tests/testthat/bad/multiple_xml/second_metadata.xml new file mode 100644 index 0000000..0db4556 --- /dev/null +++ b/tests/testthat/bad/multiple_xml/second_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/no_metadata/bad_meatdata.xml b/tests/testthat/bad/no_metadata/bad_meatdata.xml new file mode 100644 index 0000000..e69de29 diff --git a/tests/testthat/bad/no_metadata/bad_metadata.txt b/tests/testthat/bad/no_metadata/bad_metadata.txt new file mode 100644 index 0000000..e69de29 diff --git a/tests/testthat/bad/unreadable_xml/unreadable_metadata.xml b/tests/testthat/bad/unreadable_xml/unreadable_metadata.xml new file mode 100644 index 0000000..2dd7e59 --- /dev/null +++ b/tests/testthat/bad/unreadable_xml/unreadable_metadata.xml @@ -0,0 +1,2 @@ +FGDC-STD-001-1998 \ No newline at end of file diff --git a/tests/testthat/bad/wrong_meta_formats/iso/iso_metadata.xml b/tests/testthat/bad/wrong_meta_formats/iso/iso_metadata.xml new file mode 100644 index 0000000..325c597 --- /dev/null +++ b/tests/testthat/bad/wrong_meta_formats/iso/iso_metadata.xml @@ -0,0 +1 @@ +schemas.isotc211.org/19115 \ No newline at end of file diff --git a/tests/testthat/bad/wrong_meta_formats/weird_metadata.xml b/tests/testthat/bad/wrong_meta_formats/weird_metadata.xml new file mode 100644 index 0000000..5902fa7 --- /dev/null +++ b/tests/testthat/bad/wrong_meta_formats/weird_metadata.xml @@ -0,0 +1 @@ +who even knows what format I'm in! diff --git a/tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..10920ad --- /dev/null +++ b/tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -0,0 +1,16888 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/good/BICY_good/Mini_BICY_Veg_Geography.csv b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/tests/testthat/good/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv new file mode 100644 index 0000000..54c9029 --- /dev/null +++ b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Capparis flexuosa,"Limber caper, Bayleaf capertree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Eupatorium capillifolium,Dog-fennel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Laguncularia racemosa,White mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Hydrilla verticillata,Water-thyme,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Agalinis fasciculata,Beach false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Physostegia purpurea,"False dragonhead, Eastern false dragonhead",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Psidium guajava,Guava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,9,-81.2799,26.162496913975417,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Citrus sinensis,Sweet orange,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Piloblephis rigida,Wild pennyroyal,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Ardisia escallonioides,Marlberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Centrosema virginianum,Spurred butterfly-pea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-10,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-20,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-24,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Aristida beyrichiana,Southern wiregrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Scleria,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-06-03,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Bursera simaruba,Gumbo-limbo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Buttonwood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,74,-81.27757867329474,26.166855550671237,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Tripsacum dactyloides,"Eastern gamagrass, Fakahatchee grass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A diff --git a/tests/testthat/good/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..756a8e2 --- /dev/null +++ b/tests/testthat/good/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-04-24,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-03-03,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-02-20,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-07-11,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-01,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,1,260,704,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-07-31,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2002-05-17,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-02-26,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,2002-07-17,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-11-05,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-05-15,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-15,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-07-01,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-04-02,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-03-20,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-20,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2003-03-20,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2002-05-07,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-06-18,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-19,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-06,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,2002-04-09,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-03-25,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-04-17,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-11,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-03-19,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-06-04,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,2003-04-09,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2004-03-24,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,2003-02-05,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-11-15,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,2002-08-01,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2003-11-26,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-02-26,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-03-05,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2004-05-12,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-18,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2002-04-09,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-25,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-03-05,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-11,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,2004-03-11,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-02-25,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-05-20,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-06-18,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-12-20,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,2002-05-29,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2003-09-11,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-04-24,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-07-17,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2002-08-07,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2003-02-28,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,2003-09-11,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-23,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-03-20,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-21,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,2002-08-22,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-22,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2002-09-18,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-08-23,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2002-08-01,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-03-28,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-24,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-09,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-05-18,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2002-07-18,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,2004-06-24,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2003-03-11,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2002-06-05,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-02,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,2003-09-11,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-06-04,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-06-13,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-04-02,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,2003-02-20,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2003-02-27,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-05-26,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-06-13,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2004-06-17,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-03-25,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-11,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-17,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-03-31,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,2004-04-08,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-21,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-06-20,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-05-31,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-06-12,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-05-06,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2002-12-20,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,2003-03-18,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,2002-05-28,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-04-28,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-11-08,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-13,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-03-12,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2003-02-26,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-26,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,2004-04-01,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2004-03-17,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-05,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-02-04,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-29,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2004-03-26,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-03-25,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-06-03,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2003-05-14,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2003-09-16,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,2003-03-13,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-27,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-14,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-19,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-27,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,2004-05-20,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,2002-11-05,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,2003-05-23,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-04-14,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-03-06,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,2003-03-12,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-09,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2002-08-23,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-04-16,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-03-19,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-31,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-06-04,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-06-03,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-09,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-10,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,2002-05-20,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-23,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-22,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-10,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-05-24,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-05-22,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-07,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-28,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-09-17,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2004-05-07,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-29,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-08,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-06-12,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-22,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-11,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-13,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-27,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-18,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,2003-02-20,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-05-09,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-13,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-21,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-06-12,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-03-24,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,2002-05-09,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-29,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-05-22,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2002-05-07,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2004-05-07,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-03-04,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-04-29,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-12,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-07-31,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-01,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2004-04-01,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-17,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2004-04-06,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-05,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2004-06-01,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,2004-05-05,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,2003-05-23,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,2003-01-04,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-09-10,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2002-08-09,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,2003-05-03,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-05-31,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,2003-04-29,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-08,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-09-17,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2003-03-06,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-08-23,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-04,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-10-29,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2002-08-09,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,2002-11-08,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-02,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-02-21,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2002-10-31,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-29,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A diff --git a/tests/testthat/good/BUIS_good/BUIS_herps.csv b/tests/testthat/good/BUIS_good/BUIS_herps.csv new file mode 100644 index 0000000..daf92ae --- /dev/null +++ b/tests/testthat/good/BUIS_good/BUIS_herps.csv @@ -0,0 +1,47 @@ +eventDate,eventDate_flag,lifeStage,sex,locality,recordedBy,verbatimCoordinateSystem,geodeticDatum,decimalLatitude,decimalLongitude,verbatimCoordinates,Point_ID,coordinateUncertaintyInMeters,coordinate_flag,catalogNumber,samplingProtocol,occurrenceRemarks,order,family,genus,specificEpithet,infraspecificEpithet,vernacularName,scientificName,scientificName_flag,establishmentMeans,eventRemarks,custom_SpeciesCode,custom_CaptureID,custom_SnoutToVentLengthInMm,custom_Substrate,custom_Collected,custom_SpecimenID,custom_CollectionDate,custom_SacrificeDate,custom_Fixative,custom_Preservative +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3396,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,2,16,NA,1,9,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3398,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,3,26,NA,1,11,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3397,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,4,20,NA,1,10,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789304107479747,-82.6232285973053,E 327939 N 1967620,3,20,A,BUIS 3393,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,5,27,NA,1,6,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78820833617135,-82.62134174481531,E 328138 N 1967497,5,20,A,BUIS 3395,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,6,24,NA,1,8,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790153112468364,-82.62653747081812,E 327589 N 1967717,4,20,A,BUIS 3394,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,7,20,NA,1,7,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3391,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,8,27,NA,1,4,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3388,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,9,17,NA,1,1,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3389,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,10,25,NA,1,2,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3392,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,11,14,NA,1,5,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3390,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,12,26,NA,1,3,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3414,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,13,58,NA,1,27,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3411,Opportunistic Encounter Survey,Right hind foot broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,14,46,NA,1,24,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3412,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,15,43,NA,1,25,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3413,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,16,49,NA,1,26,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3410,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,17,52,NA,1,23,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3409,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,18,59,NA,1,22,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.787949020721694,-82.62210338788441,E 328057 N 1967469,9,20,A,BUIS 3403,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,19,54,NA,1,16,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789456323873306,-82.62774788298215,E 327460 N 1967641,12,20,A,BUIS 3408,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,20,63,NA,1,21,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3402,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,21,43,NA,1,15,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3407,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,22,44,NA,1,20,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3401,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,23,46,NA,1,14,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3404,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,24,45,NA,1,17,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3406,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,25,56,NA,1,19,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3405,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,26,62,NA,1,18,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.785244256880826,-82.62355974989633,E 327900 N 1967171,6,20,A,BUIS 3399,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,27,50,NA,1,12,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.784889496549056,-82.62275484678544,E 327985 N 1967131,7,20,A,BUIS 3400,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,28,54,NA,1,13,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Juvenile,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,29,23,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,30,61,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,31,52,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,32,47,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,33,46,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,34,56,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,35,47,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,36,44,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,37,45,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,38,47,Acacia,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,39,48,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,40,62,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,41,50,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under wood litter,Sbe,42,31,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,43,29,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,44,32,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,45,60,Tree,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,46,57,Bare Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,47,63,Tree Leaf,0,29,NA,NA,NA,NA diff --git a/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..0db4556 --- /dev/null +++ b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/good/README.txt b/tests/testthat/good/README.txt new file mode 100644 index 0000000..2d9c166 --- /dev/null +++ b/tests/testthat/good/README.txt @@ -0,0 +1 @@ +WARNING: All datasets in this folder were created and modified for the sole purpose of testing. Do not use these datasets for scientific purposes. \ No newline at end of file diff --git a/tests/testthat/test-tabular_data_congruence.R b/tests/testthat/test-tabular_data_congruence.R new file mode 100644 index 0000000..766c2f6 --- /dev/null +++ b/tests/testthat/test-tabular_data_congruence.R @@ -0,0 +1,39 @@ +good_dir <- here::here("tests", "testthat", "good") +bad_dir <- here::here("tests", "testthat", "bad") + +# ---- load_metadata ---- + +test_that("load_metadata works on valid EML file", { + expect_message(load_metadata(here::here(good_dir, "BICY_good")), + ".*Metadata check passed.*") + expect_message(load_metadata(here::here(good_dir, "BUIS_good")), + ".*Metadata check passed.*") +}) + +test_that("load_metadata throws an error for non-EML formats", { + expect_error(load_metadata(here::here(bad_dir, "wrong_meta_formats", "fgdc")), + "Congruence checking is not yet supported for fgdc") + expect_error(load_metadata(here::here(bad_dir, "wrong_meta_formats", "iso")), + "Congruence checking is not yet supported for ISO19915") +}) + +test_that("load_metadata throws an error for non-EML formats", { + expect_error(load_metadata(here::here(bad_dir, "wrong_meta_formats", "fgdc")), + "Congruence checking is not yet supported for fgdc") + expect_error(load_metadata(here::here(bad_dir, "wrong_meta_formats", "iso")), + "Congruence checking is not yet supported for ISO19915") + expect_error(load_metadata(here::here(bad_dir, "wrong_meta_formats")), + "Could not determine metadata format") +}) + +test_that("load_metadata throws an error when there is no xml file with '_metadata' in the name", { + expect_error(load_metadata(here::here(bad_dir, "no_metadata")), + "Metadata check failed. No metadata found.") +}) + +test_that("load_metadata throws an error when there are multiple xml files with '_metadata' in the name", { + expect_error(load_metadata(here::here(bad_dir, "multiple_xml")), + "Metadata check failed. The data package format only allows one metadata file per data package.") +}) + +# ---- test_metadata_version ---- From 2f467f4e98114efeb40af0f377e3d084fb74fa12 Mon Sep 17 00:00:00 2001 From: Wright Date: Thu, 1 Dec 2022 15:30:34 -0700 Subject: [PATCH 33/60] Update EMLeditor fxn names --- R/tabular_data_congruence.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 41fbc92..396a419 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -513,8 +513,8 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d } # Get begin date from metadata - meta_begin_date <- readr::parse_datetime(EMLeditor::get.beginDate(metadata), format = "%d %B %Y") - meta_end_date <- readr::parse_datetime(EMLeditor::get.endDate(metadata), format = "%d %B %Y") + meta_begin_date <- readr::parse_datetime(EMLeditor::get_begin_date(metadata), format = "%d %B %Y") + meta_end_date <- readr::parse_datetime(EMLeditor::get_end_date(metadata), format = "%d %B %Y") meta_date_range <- c(begin = meta_begin_date, end = meta_end_date) # Check if temporal coverage info is complete. Throw a warning if it's missing entirely and an error if it's only partially complete. From 592b2fd1228ef487507a00c2c75561480903242a Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 5 Dec 2022 16:54:59 -0700 Subject: [PATCH 34/60] Update example files for testing --- ...(POST-EDITOR) Example_BICY_Veg_metadata.xml | 18 ++++-------------- .../Mini_BICY_Veg_Geography.csv | 0 .../Mini_BICY_Veg_Intercept_Cleaned.csv | 0 .../Mini_BICY_Veg_Transect_Cleaned.csv | 0 .../bad/{BUIS_good => BUIS_bad}/BUIS_herps.csv | 0 .../BUIS_herps_EMLeditor_metadata.xml | 7 ++----- .../BUIS_herps_EMLeditor_metadata.xml | 2 +- 7 files changed, 7 insertions(+), 20 deletions(-) rename tests/testthat/bad/{BICY_good => BICY_bad}/(POST-EDITOR) Example_BICY_Veg_metadata.xml (99%) rename tests/testthat/bad/{BICY_good => BICY_bad}/Mini_BICY_Veg_Geography.csv (100%) rename tests/testthat/bad/{BICY_good => BICY_bad}/Mini_BICY_Veg_Intercept_Cleaned.csv (100%) rename tests/testthat/bad/{BICY_good => BICY_bad}/Mini_BICY_Veg_Transect_Cleaned.csv (100%) rename tests/testthat/bad/{BUIS_good => BUIS_bad}/BUIS_herps.csv (100%) rename tests/testthat/bad/{BUIS_good => BUIS_bad}/BUIS_herps_EMLeditor_metadata.xml (98%) diff --git a/tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml similarity index 99% rename from tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml index 10920ad..f3c8c8a 100644 --- a/tests/testthat/bad/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml +++ b/tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295086 EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) @@ -15820,15 +15820,6 @@ complete - - - Judd - Patterson - - NPS - judd_patterson@nps.gov - https://orcid.org/0000-0002-0951-7917 - National Park Service
@@ -15859,11 +15850,11 @@ d2f8fe468e393c41c6dccf30bab1a91a - 1 + 2 \n column - , + ,, @@ -16343,11 +16334,10 @@ 1121726158224578eb5a1125f5c35624 - 1 \n column - , + .. diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv b/tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Geography.csv similarity index 100% rename from tests/testthat/bad/BICY_good/Mini_BICY_Veg_Geography.csv rename to tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Geography.csv diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv b/tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Intercept_Cleaned.csv similarity index 100% rename from tests/testthat/bad/BICY_good/Mini_BICY_Veg_Intercept_Cleaned.csv rename to tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Intercept_Cleaned.csv diff --git a/tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Transect_Cleaned.csv similarity index 100% rename from tests/testthat/bad/BICY_good/Mini_BICY_Veg_Transect_Cleaned.csv rename to tests/testthat/bad/BICY_bad/Mini_BICY_Veg_Transect_Cleaned.csv diff --git a/tests/testthat/bad/BUIS_good/BUIS_herps.csv b/tests/testthat/bad/BUIS_bad/BUIS_herps.csv similarity index 100% rename from tests/testthat/bad/BUIS_good/BUIS_herps.csv rename to tests/testthat/bad/BUIS_bad/BUIS_herps.csv diff --git a/tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml similarity index 98% rename from tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml rename to tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml index 0db4556..2313374 100644 --- a/tests/testthat/bad/BUIS_good/BUIS_herps_EMLeditor_metadata.xml +++ b/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295037 Buck Island Reef National Monument Herpetofauna Inventories @@ -438,12 +438,9 @@ were conducted during both day and night on both of these days. The survey condu ed3c6bcc251ef21f45ace46d4ae09e70 - 1 + 1 \n column - - , - diff --git a/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml index 0db4556..a3fcfb8 100644 --- a/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml +++ b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295037 Buck Island Reef National Monument Herpetofauna Inventories From ca2e2700f5b300edaaa3fc60f3630f7f6da67088 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 5 Dec 2022 16:58:00 -0700 Subject: [PATCH 35/60] Add tests --- tests/testthat/test-tabular_data_congruence.R | 93 ++++++++++++++++++- 1 file changed, 91 insertions(+), 2 deletions(-) diff --git a/tests/testthat/test-tabular_data_congruence.R b/tests/testthat/test-tabular_data_congruence.R index 766c2f6..29eda8f 100644 --- a/tests/testthat/test-tabular_data_congruence.R +++ b/tests/testthat/test-tabular_data_congruence.R @@ -4,9 +4,9 @@ bad_dir <- here::here("tests", "testthat", "bad") # ---- load_metadata ---- test_that("load_metadata works on valid EML file", { - expect_message(load_metadata(here::here(good_dir, "BICY_good")), + expect_message(load_metadata(here::here(good_dir, "BICY_good"), inform_success = TRUE), ".*Metadata check passed.*") - expect_message(load_metadata(here::here(good_dir, "BUIS_good")), + expect_message(load_metadata(here::here(good_dir, "BUIS_good"), inform_success = TRUE), ".*Metadata check passed.*") }) @@ -37,3 +37,92 @@ test_that("load_metadata throws an error when there are multiple xml files with }) # ---- test_metadata_version ---- +test_that("test_metadata_version displays success message for supported EML versions", { + expect_message(test_metadata_version(load_metadata(here::here(good_dir, "BICY_good"))), + "Your EML version 2.2.0 is supported.") + expect_message(test_metadata_version(load_metadata(here::here(good_dir, "BUIS_good"))), + "Your EML version 2.2.3 is supported.") + +}) + +test_that("test_metadata_version throws error and displays failure message for unsupported EML versions", { + expect_error(test_metadata_version(load_metadata(here::here(bad_dir, "BICY_bad"))), + "Unsupported EML version: EML must be 2.2.0 or later. Your version is 2.1.0.") +}) + +test_that("test_metadata_version throws error for invalid EML versions", { + expect_error(test_metadata_version(load_metadata(here::here(bad_dir, "BUIS_bad")))) +}) + + +# ---- test_validate_schema ---- +test_that("test_validate_schema displays success message for valid schema", { + expect_message(test_validate_schema(load_metadata(here::here(good_dir, "BICY_good"))), + "Your metadata is schema valid.") + expect_message(test_validate_schema(load_metadata(here::here(good_dir, "BUIS_good"))), + "Your metadata is schema valid.") + +}) + +test_that("test_validate_schema throws error if eml validation returns errors or warnings", { + expect_error(test_validate_schema(load_metadata(here::here(bad_dir, "BICY_bad"))), + "Your metadata is schema-invalid.") +}) + +# ---- test_footer ---- +test_that("test_footer displays success message if metadata indicates no footer", { + expect_message(test_footer(load_metadata(here::here(good_dir, "BICY_good"))), + "Metadata indicates data files do not have footers.") + expect_message(test_footer(load_metadata(here::here(good_dir, "BUIS_good"))), + "Metadata indicates data files do not have footers.") + +}) + +test_that("test_footer throws error if metadata indicates footers present", { + expect_error(test_footer(load_metadata(here::here(bad_dir, "BUIS_bad"))), + "Metadata indicates that data files include footers. Please remove all footers from data files.") +}) +# ---- test_header_num ---- +test_that("test_header_num displays success message if metadata indicates exactly one header row per file", { + expect_message(test_header_num(load_metadata(here::here(good_dir, "BICY_good"))), + "Metadata indicates that each data file contains exactly one header row.") + expect_message(test_header_num(load_metadata(here::here(good_dir, "BUIS_good"))), + "Metadata indicates that each data file contains exactly one header row.") + +}) + +test_that("test_header_num throws error if metadata does not contain header info", { + expect_error(test_header_num(load_metadata(here::here(bad_dir, "BUIS_bad"))), + "Metadata does not contain information about number of header rows") +}) + +test_that("test_header_num throws error if metadata indicates wrong number of header rows", { + expect_error(test_header_num(load_metadata(here::here(bad_dir, "BICY_bad"))), + "Metadata indicates that the following data files contain either zero or more than one header row:") +}) + +# ---- test_delimiter ---- +test_that("test_delimiter displays success message if metadata indicates that data files contain single delimiter", { + expect_message(test_delimiter(load_metadata(here::here(good_dir, "BICY_good"))), + "Metadata indicates that each data file contains a field delimiter that is a single character") + expect_message(test_delimiter(load_metadata(here::here(good_dir, "BUIS_good"))), + "Metadata indicates that each data file contains a field delimiter that is a single character") + +}) + +test_that("test_delimiter throws error if metadata does not contain delimiter info", { + expect_error(test_delimiter(load_metadata(here::here(bad_dir, "BUIS_bad"))), + "Metadata does not contain information about the field delimiter") +}) + +test_that("test_delimiter throws error if metadata indicates delimiter with zero or multiple characters", { + expect_error(test_delimiter(load_metadata(here::here(bad_dir, "BICY_bad"))), + "Metadata indicates that the following data files do not contain valid delimiters:.*Example Intercept Observations.*Example Transect Observations$") +}) +# ---- test_dup_meta_entries ---- +# ---- test_dup_data_files ---- +# ---- test_file_name_match ---- +# ---- test_fields_match ---- +# ---- test_numeric_fields ---- +# ---- test_date_range ---- +# ---- convert_datetime_format ---- From 15463ada77814d61d8134f9979af866af90a9c09 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 5 Dec 2022 17:00:10 -0700 Subject: [PATCH 36/60] Add option to suppress message from load_metadata --- R/tabular_data_congruence.R | 7 +++++-- man/load_metadata.Rd | 4 +++- 2 files changed, 8 insertions(+), 3 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 396a419..1c2239a 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -5,6 +5,7 @@ #' @details given a path or directory - default is the working directory - load_metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. #' #' @param directory the directory where the metadata file is found - i.e. your data package. Defaults to your current project directory. +#' @param inform_success Boolean indicating whether to display a message when metadata is successfully loaded. #' #' @return an R-object formatted as EML metadata. #' @export @@ -12,7 +13,7 @@ #' @examples #' my_metadata <- load_metadata() #' -load_metadata <- function(directory = here::here()) { +load_metadata <- function(directory = here::here(), inform_success = FALSE) { # get list of all files ending in metadata.xml lf <- list.files(path = directory, pattern = "metadata.xml") metadata_file <- file.path(directory, lf) @@ -36,7 +37,9 @@ load_metadata <- function(directory = here::here()) { if (is.null(metadata)) { cli::cli_abort(c("x" = "Could not load metadata.")) } else { - cli::cli_inform(c("v" = "Metadata check passed. EML metadata {.file {metadata_file}} found and loaded into R.")) + if (inform_success) { + cli::cli_inform(c("v" = "Metadata check passed. EML metadata {.file {metadata_file}} found and loaded into R.")) + } } } else { cli::cli_abort(c("x" = "Could not determine metadata format.")) diff --git a/man/load_metadata.Rd b/man/load_metadata.Rd index e68b32b..2385671 100644 --- a/man/load_metadata.Rd +++ b/man/load_metadata.Rd @@ -4,10 +4,12 @@ \alias{load_metadata} \title{Load Metadata} \usage{ -load_metadata(directory = here::here()) +load_metadata(directory = here::here(), inform_success = FALSE) } \arguments{ \item{directory}{the directory where the metadata file is found - i.e. your data package. Defaults to your current project directory.} + +\item{inform_success}{Boolean indicating whether to display a message when metadata is successfully loaded.} } \value{ an R-object formatted as EML metadata. From 6e1a3a6c080b6a85f1cf6996dd6d7e6a4b4f4dfe Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 5 Dec 2022 17:01:00 -0700 Subject: [PATCH 37/60] Handle case where numeric_version() can't parse version --- R/tabular_data_congruence.R | 5 ++++- 1 file changed, 4 insertions(+), 1 deletion(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 1c2239a..f09a980 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -93,7 +93,10 @@ load_data <- function(directory = here::here()) { test_metadata_version <- function(metadata = load_metadata(here::here())) { vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", metadata)[1], 1, 5) - vers <- numeric_version(vers) + tryCatch(vers <- numeric_version(vers), + error = function(err) { + cli::cli_abort(c("x" = err$message)) + }) if (vers < "2.2.0") { cli::cli_abort(c("x" = "Unsupported EML version: EML must be 2.2.0 or later. Your version is {.val {vers}}.")) } else { # vers >= 2.2.0 From 1b5ae6cd4c8c394ca86be9ca3ba25d24322c3f04 Mon Sep 17 00:00:00 2001 From: Wright Date: Mon, 5 Dec 2022 17:02:01 -0700 Subject: [PATCH 38/60] Fix test_header_num and test_delimiter to handle case when some (but not all) tables are missing header/delimiter info --- R/tabular_data_congruence.R | 61 +++++++++++++++++++++++++++---------- 1 file changed, 45 insertions(+), 16 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index f09a980..46f9cd0 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -182,17 +182,28 @@ test_footer <- function(metadata = load_metadata(here::here())) { #' test_header_num() test_header_num <- function(metadata = load_metadata(here::here())) { - header <- arcticdatautils::eml_get_simple(metadata, "numHeaderLines") - names(header) <- arcticdatautils::eml_get_simple(metadata, "entityName") - if (is.null(header)) { + tbl_metadata <- EML::eml_get(metadata, "dataTable") + if ("entityName" %in% names(tbl_metadata)) { + tbl_metadata <- list(tbl_metadata) # Handle single data table case + } + bad_headers <- sapply(tbl_metadata, function(tbl) { + header_lines <- arcticdatautils::eml_get_simple(tbl, "numHeaderLines") + return(tibble::tibble(table_name = tbl$entityName, + header_lines = ifelse(is.null(header_lines), NA, header_lines))) + }, + simplify = FALSE) + bad_headers$`@context` <- NULL + bad_headers <- do.call(rbind, bad_headers) + bad_headers <- dplyr::filter(bad_headers, is.na(header_lines) | header_lines != "1") + + if(nrow(bad_headers) == 0) { + cli::cli_inform(c("v" = "Metadata indicates that each data file contains exactly one header row.")) + } else if (all(is.na(bad_headers$header_lines))) { cli::cli_abort(c("x" = "Metadata does not contain information about number of header rows")) - } else if (any(header != "1")) { - wrong_headers <- header[header != "1"] - wrong_headers <- paste0(names(wrong_headers), ": ", wrong_headers) + } else { + wrong_headers <- paste0(bad_headers$table_name, ": ", bad_headers$header_lines) names(wrong_headers) <- rep("*", length(wrong_headers)) cli::cli_abort(c("x" = "Metadata indicates that the following data files contain either zero or more than one header row:", wrong_headers)) - } else { - cli::cli_inform(c("v" = "Metadata indicates that each data file contains exactly one header row.")) } return(invisible(metadata)) @@ -213,17 +224,35 @@ test_header_num <- function(metadata = load_metadata(here::here())) { #' test_delimiter() test_delimiter <- function(metadata = load_metadata(here::here())) { - delimit <- arcticdatautils::eml_get_simple(metadata, "fieldDelimiter") - names(delimit) <- arcticdatautils::eml_get_simple(metadata, "entityName") - if (is.null(delimit) == TRUE) { + tbl_metadata <- EML::eml_get(metadata, "dataTable") + if ("entityName" %in% names(tbl_metadata)) { + tbl_metadata <- list(tbl_metadata) # Handle single data table case + } + bad_delimit <- sapply(tbl_metadata, function(tbl) { + delimit <- tryCatch(arcticdatautils::eml_get_simple(tbl, "fieldDelimiter"), + error = function(e) { + if (grepl("not recognized", e$message)) { + "[INVALID]" + } else { + e + } + }) + return(tibble::tibble(table_name = tbl$entityName, + delimiter = ifelse(is.null(delimit), NA, delimit))) + }, + simplify = FALSE) + bad_delimit$`@context` <- NULL + bad_delimit <- do.call(rbind, bad_delimit) + bad_delimit <- dplyr::filter(bad_delimit, is.na(delimiter) | nchar(delimiter) != 1 | delimiter == "[INVALID]") + + if (nrow(bad_delimit) == 0) { + cli::cli_inform(c("v" = "Metadata indicates that each data file contains a field delimiter that is a single character")) + } else if (all(is.na(bad_delimit$delimiter))) { stop("Metadata does not contain information about the field delimiter for data files") - } else if (any(nchar(delimit) != 1)) { - wrong_delimiters <- delimit[nchar(delimit) != 1] - wrong_delimiters <- names(wrong_delimiters) + } else { + wrong_delimiters <- bad_delimit$table_name names(wrong_delimiters) <- rep("*", length(wrong_delimiters)) cli::cli_abort(c("x" = "Metadata indicates that the following data files do not contain valid delimiters:", wrong_delimiters)) - } else { - cli::cli_inform(c("v" = "Metadata indicates that each data file contains a field delimiter that is a single character")) } return(invisible(metadata)) From 315e456c52ce5d5b377f4252036caedac5c13283 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 7 Dec 2022 11:22:44 -0700 Subject: [PATCH 39/60] Minor fix to test_dup_meta_entries, delete test_dup_data_files --- NAMESPACE | 1 - R/tabular_data_congruence.R | 33 ++------------------------------- man/test_dup_data_files.Rd | 24 ------------------------ man/test_dup_meta_entries.Rd | 2 +- 4 files changed, 3 insertions(+), 57 deletions(-) delete mode 100644 man/test_dup_data_files.Rd diff --git a/NAMESPACE b/NAMESPACE index faf3777..4d72424 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -5,7 +5,6 @@ export(load_data) export(load_metadata) export(test_date_range) export(test_delimiter) -export(test_dup_data_files) export(test_dup_meta_entries) export(test_fields_match) export(test_file_name_match) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 46f9cd0..7e3cd2f 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -262,7 +262,7 @@ test_delimiter <- function(metadata = load_metadata(here::here())) { #' #' @description test_dup_meta_entries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. #' -#' @details specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. +#' @details specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. #' #' @inheritParams test_metadata_version #' @@ -286,7 +286,7 @@ test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { if (length(dups) == 0) { cli::cli_inform(c("v" = "Each data file name is used exactly once in the metadata file.")) } else if (length(dups > 0)) { # if duplicates, test failed: - names(dups) <- "*" + names(dups) <- rep("*", length(dups)) cli::cli_abort(c("x" = "Metadata file name check failed. Some filenames are used more than once in the metadata:", dups)) } @@ -294,35 +294,6 @@ test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { return(invisible(metadata)) } -#' Test Data Files for Duplicate Names -#' -#' @description test_dup_data_files looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. -#' -#' @details not sure why you'd ever need this function. Seems that most file systems won't let you have duplicate file names, but here it is for the sake of completeness. If you specify a directory other than your current working directory, it will return to the current working directory on exit. -#' -#' @inheritParams load_data -#' -#' @return Invisibly returns `metadata`. -#' @export -#' -#' @examples test_dup_data_files() -#' -test_dup_data_files <- function(directory = here::here()) { - # get data file filenames (only .csv supported for now): - data_files <- list.files(path = directory, pattern = ".csv") - - # find duplicate entries: - dups <- data_files[duplicated(data_files)] - # if no duplicates, test passed: - if (length(dups) == 0) { - cli::cli_inform(c("v" = "Each data file name is used exactly once.")) - } else if (length(dups > 0)) { # if duplicates, test failed: - names(dups) <- "*" - cli::cli_abort(c("x" = "Data file name check failed. Some filenames are used more than once.", dups_msg)) - } - return(invisible(data_files)) -} - #' File Name Match #' #' @description test_file_name_match checks to see whether all data files (.csv) within a specified directory are listed under the objectName (child of physical) element in an EML metadata file in the same directory, and vice versa. Mismatches will result in an error message. diff --git a/man/test_dup_data_files.Rd b/man/test_dup_data_files.Rd deleted file mode 100644 index 1542ad2..0000000 --- a/man/test_dup_data_files.Rd +++ /dev/null @@ -1,24 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/tabular_data_congruence.R -\name{test_dup_data_files} -\alias{test_dup_data_files} -\title{Test Data Files for Duplicate Names} -\usage{ -test_dup_data_files(directory = here::here()) -} -\arguments{ -\item{directory}{the directory where the data file(s) are found (i.e. your data package). Defaults to the current working directory. On exit, returns to the current working directory.} -} -\value{ -Invisibly returns \code{metadata}. -} -\description{ -test_dup_data_files looks at the file names of .csv files within a specified directory and tests whether there are any duplicates. -} -\details{ -not sure why you'd ever need this function. Seems that most file systems won't let you have duplicate file names, but here it is for the sake of completeness. If you specify a directory other than your current working directory, it will return to the current working directory on exit. -} -\examples{ -test_dup_data_files() - -} diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd index 4832bca..871fea6 100644 --- a/man/test_dup_meta_entries.Rd +++ b/man/test_dup_meta_entries.Rd @@ -16,7 +16,7 @@ Invisibly returns \code{metadata}. test_dup_meta_entries test to see whether there are duplicate filenames listed for the data files in (EML) metadata. } \details{ -specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. If your files are not in your working directory and you specified their location, reverts back to your working directory on exit. +specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. } \examples{ test_dup_meta_entries() From 1e78d6ab6497fa5c32240ef2834bdee1889eff27 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 7 Dec 2022 11:23:54 -0700 Subject: [PATCH 40/60] Minor fixes to test_file_name_match and test_fields_match --- R/tabular_data_congruence.R | 10 +++++++--- 1 file changed, 7 insertions(+), 3 deletions(-) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 7e3cd2f..6314bfe 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -326,8 +326,12 @@ test_file_name_match <- function(directory = here::here(), metadata = load_metad if (length(meta_only) == 0 && length(dir_only) == 0) { cli::cli_inform(c("v" = "All data files are listed in metadata and all metadata files names refer to data files.")) } else if (length(meta_only) > 0 || length(dir_only) > 0) { - names(meta_only) <- "*" - names(dir_only) <- "*" + if (length(meta_only > 0)) { + names(meta_only) <- "*" + } + if (length(dir_only) > 0) { + names(dir_only) <- "*" + } cli::cli_abort(c("x" = "{length(meta_only)} file{?s} listed in metadata and missing from data folder", meta_only, "x" = "{length(dir_only)} file{?s} present in data folder and missing from metadata", dir_only)) } @@ -379,7 +383,7 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata if (length(meta_cols) == length(data_cols) && all(meta_cols == data_cols)) { # Columns match and are in right order return(NULL) } else if (all(meta_cols %in% data_cols) && all(data_cols %in% meta_cols)) { # Columns match and are in wrong order - return(c(" " = paste0("--> ", data_file, ": Metadata column order does not match data column order"))) + return(c(" " = paste0("--> {.file ", data_file, "}: Metadata column order does not match data column order"))) } else { # Columns don't match missing_from_meta <- data_cols[!(data_cols %in% meta_cols)] if (length(missing_from_meta) > 0) { From d8f82ca10eb7572ca507d7b5cb00a17ca093876e Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 7 Dec 2022 11:24:25 -0700 Subject: [PATCH 41/60] Fix test_date_range to identify columns where some but not all dates failed to parse --- R/tabular_data_congruence.R | 5 +++++ 1 file changed, 5 insertions(+) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 6314bfe..7f2a6a7 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -575,10 +575,15 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d na_strings <- c(na_strings, unique(dttm_attrs[[data_file]]$missingValueCode)) } dttm_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = do.call(readr::cols, dttm_col_spec), show_col_types = FALSE)) + char_data <- suppressWarnings(readr::read_csv(file.path(directory, data_file), col_select = dplyr::all_of(dttm_col_names), na = na_strings, col_types = rep("c", length(dttm_col_names)), show_col_types = FALSE)) + tbl_out_of_range <- sapply(names(dttm_data), function(col) { col_data <- dttm_data[[col]] + orig_na_count <- sum(is.na(char_data[[col]])) if (all(is.na(col_data))) { return(paste0("{.field ", col, "} (failed to parse)")) + } else if (sum(is.na(col_data)) > orig_na_count) { + return(paste0("{.field ", col, "} (partially failed to parse)")) } max_date <- max(col_data, na.rm = TRUE) min_date <- min(col_data, na.rm = TRUE) From 33e69a107021aad826731af73f2f20fc4d3e4362 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 7 Dec 2022 11:24:47 -0700 Subject: [PATCH 42/60] Add unit tests --- ...POST-EDITOR) Example_BICY_Veg_metadata.xml | 16888 +++++++++++++++ .../BICY/Mini_BICY_Veg_Geography.csv | 1001 + .../BICY/Mini_BICY_Veg_Intercept_Cleaned.csv | 501 + .../BICY/Mini_BICY_Veg_Transect_Cleaned.csv | 501 + .../bad/bad_data_types/BUIS/BUIS_herps.csv | 47 + .../BUIS/BUIS_herps_EMLeditor_metadata.xml | 1040 + ...POST-EDITOR) Example_BICY_Veg_metadata.xml | 16870 +++++++++++++++ .../BICY_columns/Mini_BICY_Veg_Geography.csv | 1001 + .../Mini_BICY_Veg_Intercept_Cleaned.csv | 501 + .../Mini_BICY_Veg_Transect_Cleaned.csv | 501 + ...POST-EDITOR) Example_BICY_Veg_metadata.xml | 17805 ++++++++++++++++ .../BICY_files/Mini_BICY_Veg_Geography.csv | 1001 + .../BICY_files/Mini_BICY_Veg_Intercept.csv | 501 + .../Mini_BICY_Veg_Transect_Cleaned.csv | 501 + .../BUIS_columns/BUIS_herps.csv | 47 + .../BUIS_herps_EMLeditor_metadata.xml | 1027 + .../BUIS_herps_EMLeditor_metadata.xml | 1608 ++ tests/testthat/test-tabular_data_congruence.R | 88 +- 18 files changed, 61428 insertions(+), 1 deletion(-) create mode 100644 tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Geography.csv create mode 100644 tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Intercept_Cleaned.csv create mode 100644 tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 tests/testthat/bad/bad_data_types/BUIS/BUIS_herps.csv create mode 100644 tests/testthat/bad/bad_data_types/BUIS/BUIS_herps_EMLeditor_metadata.xml create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Geography.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Intercept_Cleaned.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Geography.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Intercept.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps.csv create mode 100644 tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps_EMLeditor_metadata.xml create mode 100644 tests/testthat/bad/data_metadata_mismatch/BUIS_files/BUIS_herps_EMLeditor_metadata.xml diff --git a/tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..10920ad --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -0,0 +1,16888 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Geography.csv b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Intercept_Cleaned.csv b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Intercept_Cleaned.csv new file mode 100644 index 0000000..a193ab9 --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Intercept_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,06-24-2004,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,NA,-81.2799,26.162496913975417,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,oops,74,-81.27757867329474,26.166855550671237,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,06-24-2004,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Centrosema virginianum,Spurred butterfly-pea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,06-24-2004,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,06-24-2004,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Scleria,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +Hydrilla verticillata,Water-thyme,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Eupatorium capillifolium,Dog-fennel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Aristida beyrichiana,Southern wiregrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Capparis flexuosa,"Limber caper, Bayleaf capertree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Laguncularia racemosa,White mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Bursera simaruba,Gumbo-limbo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Tripsacum dactyloides,"Eastern gamagrass, Fakahatchee grass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Buttonwood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Physostegia purpurea,"False dragonhead, Eastern false dragonhead",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Piloblephis rigida,Wild pennyroyal,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Agalinis fasciculata,Beach false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Citrus sinensis,Sweet orange,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Psidium guajava,Guava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Ardisia escallonioides,Marlberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A \ No newline at end of file diff --git a/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..ebf25a5 --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BICY/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/24/2004,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,6/24/2004,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,6/24/2004,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,6/24/2004,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,6/24/2004,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,6/24/2004,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,6/24/2004,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,6/24/2004,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,6/24/2004,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,6/24/2004,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,6/24/2004,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,6/24/2004,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,6/24/2004,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/24/2004,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,6/24/2004,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,6/24/2004,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/24/2004,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,6/8/2004,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,6/8/2004,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,6/8/2004,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,6/8/2004,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,6/8/2004,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,6/8/2004,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,6/8/2004,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,6/8/2004,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,6/8/2004,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,6/8/2004,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,6/8/2004,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,6/8/2004,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,6/8/2004,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,6/8/2004,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,6/8/2004,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,6/8/2004,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,6/8/2004,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,6/8/2004,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,6/8/2004,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,6/8/2004,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,6/8/2004,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,6/8/2004,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,6/8/2004,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,6/8/2004,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,6/8/2004,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,6/8/2004,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,6/8/2004,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,6/8/2004,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,6/8/2004,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,6/8/2004,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,6/8/2004,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,6/8/2004,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,6/8/2004,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,6/8/2004,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,6/8/2004,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,6/8/2004,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,6/8/2004,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,6/8/2004,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,6/8/2004,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,6/8/2004,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,6/8/2004,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,6/8/2004,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,6/8/2004,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,6/8/2004,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,6/8/2004,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,6/8/2004,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,6/8/2004,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,6/8/2004,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,6/8/2004,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,6/8/2004,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,6/8/2004,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,6/8/2004,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,6/8/2004,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,6/8/2004,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,6/8/2004,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,6/8/2004,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,6/8/2004,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,6/8/2004,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,6/8/2004,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,6/8/2004,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,6/8/2004,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,6/8/2004,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,6/8/2004,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,6/8/2004,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,6/8/2004,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,6/8/2004,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,6/8/2004,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,6/8/2004,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,6/8/2004,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,6/8/2004,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,6/8/2004,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,6/8/2004,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,6/8/2004,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,6/8/2004,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,6/8/2004,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,6/8/2004,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,6/8/2004,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,6/8/2004,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,6/8/2004,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,6/8/2004,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,6/8/2004,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,6/8/2004,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,6/8/2004,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,6/8/2004,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,6/8/2004,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,6/8/2004,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,6/8/2004,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,6/8/2004,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,6/8/2004,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,6/8/2004,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,6/8/2004,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,6/8/2004,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,6/8/2004,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,6/8/2004,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,6/8/2004,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,6/8/2004,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,6/8/2004,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,6/8/2004,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,6/8/2004,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,6/8/2004,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,6/8/2004,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,6/8/2004,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,6/8/2004,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,6/8/2004,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,6/8/2004,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,6/8/2004,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,6/8/2004,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,one,260,704,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,6/8/2004,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,6/8/2004,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,6/8/2004,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,6/8/2004,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,6/8/2004,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,6/8/2004,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,6/8/2004,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,6/8/2004,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,6/8/2004,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,6/8/2004,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,6/8/2004,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,6/8/2004,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,6/8/2004,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,6/8/2004,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,6/8/2004,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,6/8/2004,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,6/8/2004,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,6/8/2004,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,6/8/2004,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,6/8/2004,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,6/8/2004,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,6/8/2004,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,6/8/2004,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,6/8/2004,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,6/8/2004,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,6/8/2004,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,6/8/2004,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,6/8/2004,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,6/8/2004,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,6/8/2004,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,6/8/2004,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,6/8/2004,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,6/8/2004,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,6/8/2004,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,6/8/2004,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,6/8/2004,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,6/8/2004,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,6/8/2004,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,6/8/2004,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,6/8/2004,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,6/8/2004,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,6/8/2004,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,6/8/2004,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,,613,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,6/8/2004,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,6/8/2004,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,6/8/2004,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,6/8/2004,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,6/8/2004,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,6/8/2004,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,6/8/2004,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,6/8/2004,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,6/8/2004,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,6/8/2004,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,6/8/2004,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,6/8/2004,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,6/8/2004,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,6/8/2004,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,6/8/2004,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,6/8/2004,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,6/8/2004,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,6/8/2004,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,6/8/2004,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,6/8/2004,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,6/8/2004,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,6/8/2004,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,6/8/2004,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,6/8/2004,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,6/8/2004,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,6/8/2004,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,6/8/2004,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,6/8/2004,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,6/8/2004,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,6/8/2004,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,6/8/2004,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,6/8/2004,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,6/8/2004,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,6/8/2004,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,6/8/2004,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,6/8/2004,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,6/8/2004,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,6/8/2004,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,6/8/2004,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,6/8/2004,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,6/8/2004,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,6/8/2004,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,6/8/2004,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,6/8/2004,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,6/8/2004,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,6/8/2004,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,6/8/2004,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,6/8/2004,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,6/8/2004,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,6/8/2004,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,,556,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,6/8/2004,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,6/8/2004,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,6/8/2004,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,6/8/2004,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,6/8/2004,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,6/8/2004,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,6/8/2004,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,6/8/2004,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,6/8/2004,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,6/8/2004,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,6/8/2004,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,6/8/2004,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,6/8/2004,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,6/8/2004,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,6/8/2004,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,6/8/2004,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,6/8/2004,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,6/8/2004,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,6/8/2004,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,6/8/2004,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,6/8/2004,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,6/8/2004,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,6/8/2004,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,6/8/2004,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,6/8/2004,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,6/8/2004,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,6/8/2004,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,6/8/2004,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,6/8/2004,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,6/8/2004,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,6/8/2004,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,6/8/2004,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,6/8/2004,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,6/8/2004,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,6/8/2004,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,6/8/2004,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,6/8/2004,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,6/8/2004,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,6/8/2004,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,6/8/2004,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,6/8/2004,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,6/8/2004,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,6/8/2004,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,6/8/2004,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,6/8/2004,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,6/8/2004,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,6/8/2004,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,6/8/2004,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,6/8/2004,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,6/8/2004,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,6/8/2004,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,6/8/2004,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,6/8/2004,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,6/8/2004,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,6/8/2004,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,6/8/2004,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,6/8/2004,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,6/8/2004,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,6/8/2004,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,6/8/2004,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,6/8/2004,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,6/8/2004,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,6/8/2004,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,6/8/2004,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,6/8/2004,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,6/8/2004,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,6/8/2004,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,6/8/2004,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,6/8/2004,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,6/8/2004,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,6/8/2004,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,6/8/2004,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,6/8/2004,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,6/8/2004,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,6/8/2004,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,6/8/2004,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,6/8/2004,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,6/8/2004,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,6/8/2004,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,6/8/2004,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,6/8/2004,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,6/8/2004,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,6/8/2004,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,6/8/2004,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,6/8/2004,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,6/8/2004,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,6/8/2004,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,6/8/2004,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,6/8/2004,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,6/8/2004,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,6/8/2004,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,6/8/2004,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,6/8/2004,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,6/8/2004,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,6/8/2004,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,6/8/2004,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,6/8/2004,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,6/8/2004,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,6/8/2004,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,6/8/2004,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,6/8/2004,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,6/8/2004,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,6/8/2004,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,6/8/2004,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,6/8/2004,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,6/8/2004,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,6/8/2004,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,6/8/2004,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,6/8/2004,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,6/8/2004,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,6/8/2004,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,6/8/2004,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,6/8/2004,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,6/8/2004,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,6/8/2004,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,6/8/2004,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,6/8/2004,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,6/8/2004,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,6/8/2004,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,6/8/2004,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,6/8/2004,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,6/8/2004,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,6/8/2004,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,6/8/2004,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,6/8/2004,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,6/8/2004,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,6/8/2004,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,6/8/2004,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,6/8/2004,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,6/8/2004,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,6/8/2004,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,6/8/2004,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,6/8/2004,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,6/8/2004,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,6/8/2004,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,6/8/2004,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,6/8/2004,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,6/8/2004,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,6/8/2004,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,6/8/2004,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,6/8/2004,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,6/8/2004,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,6/8/2004,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,6/8/2004,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,6/8/2004,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,6/8/2004,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,6/8/2004,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,6/8/2004,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,6/8/2004,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,6/8/2004,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,6/8/2004,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,6/8/2004,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,6/8/2004,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,6/8/2004,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,6/8/2004,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,6/8/2004,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,6/8/2004,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,6/8/2004,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,6/8/2004,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,6/8/2004,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,6/8/2004,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,6/8/2004,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A \ No newline at end of file diff --git a/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps.csv b/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps.csv new file mode 100644 index 0000000..4d24c5c --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps.csv @@ -0,0 +1,47 @@ +eventDate,eventDate_flag,lifeStage,sex,locality,recordedBy,verbatimCoordinateSystem,geodeticDatum,decimalLatitude,decimalLongitude,verbatimCoordinates,Point_ID,coordinateUncertaintyInMeters,coordinate_flag,catalogNumber,samplingProtocol,occurrenceRemarks,order,family,genus,specificEpithet,infraspecificEpithet,vernacularName,scientificName,scientificName_flag,establishmentMeans,eventRemarks,custom_SpeciesCode,custom_CaptureID,custom_SnoutToVentLengthInMm,custom_Substrate,custom_Collected,custom_SpecimenID,custom_CollectionDate,custom_SacrificeDate,custom_Fixative,custom_Preservative +2020-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3396,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,2,16,NA,1,9,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3398,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,3,26,NA,1,11,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3397,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,4,20,NA,1,10,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789304107479747,-82.6232285973053,E 327939 N 1967620,3,20,A,BUIS 3393,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,5,27,NA,1,6,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78820833617135,-82.62134174481531,E 328138 N 1967497,5,20,A,BUIS 3395,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,6,24,NA,1,8,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790153112468364,-82.62653747081812,E 327589 N 1967717,4,20,A,BUIS 3394,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,7,20,NA,1,7,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3391,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,8,27,NA,1,4,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3388,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,9,17,NA,1,1,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,unsure,A,BUIS 3389,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,10,25,NA,1,2,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3392,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,11,14,NA,1,5,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3390,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,12,26,NA,1,3,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3414,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,13,58,NA,1,27,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3411,Opportunistic Encounter Survey,Right hind foot broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,14,46,NA,1,24,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3412,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,15,43,NA,1,25,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3413,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,16,49,NA,1,26,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3410,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,17,52,NA,1,23,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3409,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,18,59,NA,1,22,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.787949020721694,-82.62210338788441,E 328057 N 1967469,9,unsure,A,BUIS 3403,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,19,54,NA,1,16,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789456323873306,-82.62774788298215,E 327460 N 1967641,12,20,A,BUIS 3408,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,20,63,NA,1,21,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3402,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,21,43,NA,1,15,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3407,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,22,44,NA,1,20,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3401,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,23,46,NA,1,14,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3404,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,24,45,NA,1,17,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3406,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,25,56,NA,1,19,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3405,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,26,62,NA,1,18,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.785244256880826,-82.62355974989633,E 327900 N 1967171,6,20,A,BUIS 3399,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,27,50,NA,1,12,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.784889496549056,-82.62275484678544,E 327985 N 1967131,7,20,A,BUIS 3400,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,28,54,NA,1,13,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Juvenile,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,29,23,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,30,61,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,31,52,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,unsure,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,32,47,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,33,46,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,34,56,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,35,47,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,36,44,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,37,45,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,38,47,Acacia,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,39,48,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,40,62,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,41,50,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under wood litter,Sbe,42,31,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,43,29,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,44,32,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,45,60,Tree,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,46,57,Bare Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,47,63,Tree Leaf,0,29,NA,NA,NA,NA \ No newline at end of file diff --git a/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..a3fcfb8 --- /dev/null +++ b/tests/testthat/bad/bad_data_types/BUIS/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..011c34f --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -0,0 +1,16870 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Geography.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Intercept_Cleaned.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Intercept_Cleaned.csv new file mode 100644 index 0000000..014377d --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Intercept_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Ipomoea sagittata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Panicum rigidulum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Fuirena scirpoidea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Panicum hemitomon,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Capparis flexuosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhynchospora inundata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Sarcostemma clausum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Spiranthes odorata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +Ficus aurea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Eupatorium capillifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Rhizophora mangle,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Pluchea rosea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Ocotea coriacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Aristida purpurascens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +Coccoloba diversifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Quercus virginiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Hymenocallis palmeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +Panicum virgatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Quercus laurifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Mikania scandens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Toxicodendron radicans,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Laguncularia racemosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Tillandsia fasciculata var. densispica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Panicum tenerum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Nephrolepis exaltata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Pluchea rosea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Sagittaria graminea var. chapmanii,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Hydrilla verticillata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Agalinis fasciculata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Taxodium distichum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Pontederia cordata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Amphicarpum muhlenbergianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Hyptis alata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Tillandsia setacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Physostegia purpurea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Muhlenbergia capillaris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +Mitreola petiolata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Helenium pinnatifidum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Bacopa caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Psidium guajava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Panicum hemitomon,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Rhynchospora odorata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Rhynchospora tracyi,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Acrostichum danaeifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Coccoloba diversifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Flaveria linearis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Dichanthelium erectifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Quercus virginiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Thelypteris interrupta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Tillandsia fasciculata var. densispica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Hyptis alata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,9,-81.2799,26.162496913975417,species,A,A,A +Muhlenbergia capillaris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Salix caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Annona glabra,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Rhynchospora inundata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Sisyrinchium angustifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Citrus sinensis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Ludwigia repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia paucifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Spermacoce terminalis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A +Schinus terebinthifolius,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Cornus foemina,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Ilex cassine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Scleria baldwinii,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Taxodium distichum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Quercus virginiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +Panicum repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Sisyrinchium angustifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Centella asiatica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Piloblephis rigida,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Ruellia succulenta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Annona glabra,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Tillandsia variabilis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Panicum repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Muhlenbergia capillaris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Ruellia succulenta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Ardisia escallonioides,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Muhlenbergia capillaris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Schinus terebinthifolius,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Bacopa caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Annona glabra,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Salix caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Ilex cassine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Ludwigia microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Centrosema virginianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Pluchea rosea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-10,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Rhynchospora inundata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-20,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +Ludwigia repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Smilax auriculata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Eleocharis cellulosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +Acrostichum danaeifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Cephalanthus occidentalis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Mikania scandens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Crinum americanum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Eriocaulon compressum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Eleocharis cellulosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Amphicarpum muhlenbergianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Hyptis alata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Fuirena scirpoidea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Panicum tenerum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Eriocaulon ravenelii,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-24,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +Proserpinaca palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Ludwigia microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Flaveria linearis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Rhynchospora odorata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rhynchospora miliacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Toxicodendron radicans,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +Ocotea coriacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Aristida beyrichiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Ilex cassine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Scleria,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Rhynchospora tracyi,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +Sesuvium portulacastrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Proserpinaca palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Thalia geniculata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Panicum repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Thelypteris interrupta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Woodwardia virginica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Cassytha filiformis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Spartina bakeri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Woodwardia virginica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Pteridium aquilinum var. caudatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Rhynchospora miliacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Tillandsia setacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Pontederia cordata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Centella asiatica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rhizophora mangle,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Saccharum giganteum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Psychotria sulzneri,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Bacopa caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Schinus terebinthifolius,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Rhynchospora inundata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Flaveria linearis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Amphicarpum muhlenbergianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Quercus virginiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Tillandsia fasciculata var. densispica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-06-03,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Thalia geniculata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Mikania scandens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Bursera simaruba,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Hydrolea corymbosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Nephrolepis biserrata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Solidago stricta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Dichanthelium erectifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Proserpinaca palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Panicum hemitomon,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Crinum americanum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Ludwigia microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Conoclinium coelestinum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Thelypteris interrupta,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Tillandsia balbisiana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Salix caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Elionurus tripsacoides,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Hyptis alata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Rhus copallinum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Hydrolea corymbosa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Rhynchospora tracyi,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +Fuirena scirpoidea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Amphicarpum muhlenbergianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Acer rubrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Bacopa caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium distichum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Myrica cerifera,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Crinum americanum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Bacopa caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Schinus terebinthifolius,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,74,-81.27757867329474,26.166855550671237,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Ludwigia repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Tillandsia setacea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Rhizophora mangle,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Tillandsia utriculata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Amphicarpum muhlenbergianum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Eupatorium mikanioides,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Cassytha filiformis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Salix caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Proserpinaca palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Schinus terebinthifolius,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Sabal palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Baccharis glomeruliflora,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Elytraria caroliniensis var. angustifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Rapanea punctata,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Rhynchospora divergens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Quercus laurifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Persea palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Tillandsia fasciculata var. densispica,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Tripsacum dactyloides,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Andropogon glomeratus var. pumilus,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Dichanthelium erectifolium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Proserpinaca palustris,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Juncus polycephalos,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Cassytha filiformis,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Salix caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Chrysobalanus icaco,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Taxodium distichum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Serenoa repens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Cladium jamaicense,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Sesuvium portulacastrum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Taxodium ascendens,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Fraxinus caroliniana,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Paspalum monostachyum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Quercus laurifolia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Blechnum serrulatum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Rhynchospora microcarpa,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A \ No newline at end of file diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..756a8e2 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-04-24,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-03-03,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-02-20,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-07-11,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-01,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,1,260,704,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-07-31,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2002-05-17,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-02-26,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,2002-07-17,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-11-05,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-05-15,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-15,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-07-01,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-04-02,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-03-20,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-20,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2003-03-20,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2002-05-07,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-06-18,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-19,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-06,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,2002-04-09,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-03-25,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-04-17,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-11,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-03-19,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-06-04,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,2003-04-09,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2004-03-24,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,2003-02-05,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-11-15,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,2002-08-01,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2003-11-26,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-02-26,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-03-05,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2004-05-12,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-18,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2002-04-09,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-25,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-03-05,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-11,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,2004-03-11,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-02-25,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-05-20,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-06-18,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-12-20,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,2002-05-29,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2003-09-11,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-04-24,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-07-17,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2002-08-07,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2003-02-28,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,2003-09-11,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-23,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-03-20,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-21,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,2002-08-22,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-22,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2002-09-18,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-08-23,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2002-08-01,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-03-28,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-24,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-09,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-05-18,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2002-07-18,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,2004-06-24,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2003-03-11,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2002-06-05,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-02,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,2003-09-11,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-06-04,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-06-13,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-04-02,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,2003-02-20,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2003-02-27,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-05-26,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-06-13,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2004-06-17,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-03-25,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-11,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-17,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-03-31,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,2004-04-08,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-21,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-06-20,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-05-31,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-06-12,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-05-06,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2002-12-20,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,2003-03-18,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,2002-05-28,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-04-28,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-11-08,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-13,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-03-12,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2003-02-26,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-26,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,2004-04-01,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2004-03-17,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-05,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-02-04,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-29,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2004-03-26,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-03-25,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-06-03,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2003-05-14,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2003-09-16,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,2003-03-13,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-27,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-14,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-19,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-27,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,2004-05-20,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,2002-11-05,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,2003-05-23,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-04-14,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-03-06,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,2003-03-12,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-09,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2002-08-23,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-04-16,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-03-19,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-31,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-06-04,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-06-03,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-09,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-10,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,2002-05-20,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-23,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-22,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-10,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-05-24,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-05-22,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-07,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-28,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-09-17,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2004-05-07,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-29,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-08,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-06-12,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-22,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-11,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-13,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-27,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-18,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,2003-02-20,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-05-09,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-13,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-21,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-06-12,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-03-24,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,2002-05-09,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-29,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-05-22,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2002-05-07,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2004-05-07,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-03-04,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-04-29,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-12,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-07-31,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-01,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2004-04-01,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-17,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2004-04-06,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-05,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2004-06-01,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,2004-05-05,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,2003-05-23,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,2003-01-04,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-09-10,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2002-08-09,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,2003-05-03,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-05-31,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,2003-04-29,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-08,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-09-17,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2003-03-06,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-08-23,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-04,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-10-29,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2002-08-09,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,2002-11-08,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-02,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-02-21,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2002-10-31,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-29,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..349cac5 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml @@ -0,0 +1,17805 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Duplicate Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + Duplicate Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Geography.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Intercept.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Intercept.csv new file mode 100644 index 0000000..54c9029 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Intercept.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Capparis flexuosa,"Limber caper, Bayleaf capertree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Eupatorium capillifolium,Dog-fennel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Laguncularia racemosa,White mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Hydrilla verticillata,Water-thyme,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Agalinis fasciculata,Beach false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Physostegia purpurea,"False dragonhead, Eastern false dragonhead",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Psidium guajava,Guava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,9,-81.2799,26.162496913975417,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Citrus sinensis,Sweet orange,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Piloblephis rigida,Wild pennyroyal,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Ardisia escallonioides,Marlberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Centrosema virginianum,Spurred butterfly-pea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-10,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-20,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-24,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Aristida beyrichiana,Southern wiregrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Scleria,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-06-03,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Bursera simaruba,Gumbo-limbo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Buttonwood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,74,-81.27757867329474,26.166855550671237,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Tripsacum dactyloides,"Eastern gamagrass, Fakahatchee grass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Transect_Cleaned.csv b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..756a8e2 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-04-24,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-03-03,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-02-20,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-07-11,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-01,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,1,260,704,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-07-31,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2002-05-17,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-02-26,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,2002-07-17,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-11-05,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-05-15,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-15,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-07-01,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-04-02,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-03-20,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-20,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2003-03-20,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2002-05-07,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-06-18,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-19,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-06,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,2002-04-09,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-03-25,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-04-17,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-11,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-03-19,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-06-04,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,2003-04-09,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2004-03-24,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,2003-02-05,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-11-15,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,2002-08-01,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2003-11-26,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-02-26,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-03-05,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2004-05-12,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-18,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2002-04-09,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-25,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-03-05,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-11,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,2004-03-11,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-02-25,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-05-20,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-06-18,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-12-20,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,2002-05-29,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2003-09-11,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-04-24,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-07-17,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2002-08-07,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2003-02-28,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,2003-09-11,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-23,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-03-20,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-21,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,2002-08-22,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-22,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2002-09-18,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-08-23,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2002-08-01,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-03-28,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-24,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-09,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-05-18,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2002-07-18,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,2004-06-24,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2003-03-11,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2002-06-05,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-02,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,2003-09-11,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-06-04,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-06-13,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-04-02,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,2003-02-20,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2003-02-27,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-05-26,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-06-13,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2004-06-17,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-03-25,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-11,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-17,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-03-31,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,2004-04-08,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-21,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-06-20,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-05-31,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-06-12,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-05-06,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2002-12-20,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,2003-03-18,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,2002-05-28,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-04-28,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-11-08,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-13,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-03-12,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2003-02-26,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-26,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,2004-04-01,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2004-03-17,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-05,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-02-04,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-29,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2004-03-26,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-03-25,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-06-03,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2003-05-14,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2003-09-16,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,2003-03-13,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-27,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-14,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-19,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-27,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,2004-05-20,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,2002-11-05,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,2003-05-23,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-04-14,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-03-06,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,2003-03-12,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-09,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2002-08-23,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-04-16,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-03-19,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-31,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-06-04,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-06-03,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-09,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-10,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,2002-05-20,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-23,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-22,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-10,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-05-24,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-05-22,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-07,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-28,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-09-17,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2004-05-07,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-29,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-08,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-06-12,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-22,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-11,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-13,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-27,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-18,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,2003-02-20,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-05-09,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-13,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-21,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-06-12,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-03-24,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,2002-05-09,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-29,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-05-22,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2002-05-07,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2004-05-07,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-03-04,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-04-29,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-12,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-07-31,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-01,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2004-04-01,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-17,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2004-04-06,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-05,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2004-06-01,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,2004-05-05,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,2003-05-23,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,2003-01-04,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-09-10,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2002-08-09,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,2003-05-03,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-05-31,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,2003-04-29,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-08,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-09-17,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2003-03-06,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-08-23,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-04,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-10-29,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2002-08-09,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,2002-11-08,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-02,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-02-21,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2002-10-31,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-29,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A diff --git a/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps.csv b/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps.csv new file mode 100644 index 0000000..a9c3b73 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps.csv @@ -0,0 +1,47 @@ +eventDate,eventDate_flag,lifeStage,sex,locality,recordedBy,verbatimCoordinateSystem,geodeticDatum,decimalLatitude,decimalLongitude,verbatimCoordinates,Point_ID,coordinateUncertaintyInMeters,coordinate_flag,catalogNumber,samplingProtocol,occurrenceRemarks,order,genus,specificEpithet,infraspecificEpithet,vernacularName,scientificName,scientificName_flag,establishmentMeans,eventRemarks,custom_SpeciesCode,custom_CaptureID,custom_SnoutToVentLengthInMm,custom_Substrate,custom_Collected,custom_SpecimenID,custom_CollectionDate,custom_SacrificeDate,custom_Fixative,custom_Preservative +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3396,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,2,16,NA,1,9,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3398,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,3,26,NA,1,11,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3397,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,4,20,NA,1,10,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789304107479747,-82.6232285973053,E 327939 N 1967620,3,20,A,BUIS 3393,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,5,27,NA,1,6,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78820833617135,-82.62134174481531,E 328138 N 1967497,5,20,A,BUIS 3395,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,6,24,NA,1,8,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790153112468364,-82.62653747081812,E 327589 N 1967717,4,20,A,BUIS 3394,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,7,20,NA,1,7,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3391,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,8,27,NA,1,4,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3388,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,9,17,NA,1,1,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3389,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,10,25,NA,1,2,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3392,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,11,14,NA,1,5,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3390,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,12,26,NA,1,3,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3414,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,13,58,NA,1,27,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3411,Opportunistic Encounter Survey,Right hind foot broken off.,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,14,46,NA,1,24,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3412,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,15,43,NA,1,25,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3413,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,16,49,NA,1,26,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3410,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,17,52,NA,1,23,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3409,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,18,59,NA,1,22,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.787949020721694,-82.62210338788441,E 328057 N 1967469,9,20,A,BUIS 3403,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,19,54,NA,1,16,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789456323873306,-82.62774788298215,E 327460 N 1967641,12,20,A,BUIS 3408,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,20,63,NA,1,21,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3402,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,21,43,NA,1,15,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3407,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,22,44,NA,1,20,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3401,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,23,46,NA,1,14,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3404,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,24,45,NA,1,17,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3406,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,25,56,NA,1,19,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3405,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,26,62,NA,1,18,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.785244256880826,-82.62355974989633,E 327900 N 1967171,6,20,A,BUIS 3399,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,27,50,NA,1,12,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.784889496549056,-82.62275484678544,E 327985 N 1967131,7,20,A,BUIS 3400,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,28,54,NA,1,13,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Juvenile,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,29,23,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,30,61,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,31,52,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,32,47,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,33,46,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,34,56,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,35,47,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,36,44,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,37,45,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,38,47,Acacia,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,39,48,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,40,62,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,41,50,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under wood litter,Sbe,42,31,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,43,29,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,44,32,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,45,60,Tree,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,46,57,Bare Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,NA,20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,47,63,Tree Leaf,0,29,NA,NA,NA,NA \ No newline at end of file diff --git a/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..95dabea --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BUIS_columns/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1027 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/data_metadata_mismatch/BUIS_files/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BUIS_files/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..2750e23 --- /dev/null +++ b/tests/testthat/bad/data_metadata_mismatch/BUIS_files/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1608 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + BUIS_herps_2 + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/test-tabular_data_congruence.R b/tests/testthat/test-tabular_data_congruence.R index 29eda8f..94260d9 100644 --- a/tests/testthat/test-tabular_data_congruence.R +++ b/tests/testthat/test-tabular_data_congruence.R @@ -119,10 +119,96 @@ test_that("test_delimiter throws error if metadata indicates delimiter with zero expect_error(test_delimiter(load_metadata(here::here(bad_dir, "BICY_bad"))), "Metadata indicates that the following data files do not contain valid delimiters:.*Example Intercept Observations.*Example Transect Observations$") }) + # ---- test_dup_meta_entries ---- -# ---- test_dup_data_files ---- +test_that("test_dup_meta_entries displays success message if no duplicate files listed in metadata", { + expect_message(test_dup_meta_entries(load_metadata(here::here(good_dir, "BICY_good"))), + "Each data file name is used exactly once in the metadata file.") + expect_message(test_dup_meta_entries(load_metadata(here::here(good_dir, "BUIS_good"))), + "Each data file name is used exactly once in the metadata file.") + +}) + +test_that("test_dup_meta_entries displays error message if metadata contains duplicate filenames", { + expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir,"data_metadata_mismatch", "BICY"))), + "Metadata file name check failed. Some filenames are used more than once in the metadata:.*Mini_BICY_Veg_Transect_Cleaned.csv.*Mini_BICY_Veg_Intercept_Cleaned.csv$") + expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir, "data_metadata_mismatch", "BUIS"))), + "Metadata file name check failed. Some filenames are used more than once in the metadata:.*BUIS_herps.csv$") + +}) + # ---- test_file_name_match ---- +test_that("test_file_name_match displays success message if files in data dir and metadata match", { + expect_message(test_file_name_match(here::here(good_dir, "BICY_good")), + "All data files are listed in metadata and all metadata files names refer to data files.") + expect_message(test_file_name_match(here::here(good_dir, "BUIS_good")), + "All data files are listed in metadata and all metadata files names refer to data files.") + +}) + +test_that("test_file_name_match displays error message if metadata contains filenames not in data dir and vice versa", { + expect_error(test_file_name_match(here::here(bad_dir,"data_metadata_mismatch", "BICY_files")), + "1 file listed in metadata and missing from data folder.*1 file present in data folder and missing from metadata") + expect_error(test_file_name_match(here::here(bad_dir, "data_metadata_mismatch", "BUIS_files")), + "1 file listed in metadata and missing from data folder.*0 files present in data folder and missing from metadata") + +}) + # ---- test_fields_match ---- +test_that("test_fields_match displays success message if columns in data dir and metadata match", { + expect_message(test_fields_match(here::here(good_dir, "BICY_good")), + "All columns in data match all columns in metadata") + expect_message(test_fields_match(here::here(good_dir, "BUIS_good")), + "All columns in data match all columns in metadata") + +}) + +test_that("test_fields_match displays error message if columns are missing from data/metadata or in wrong order", { + expect_error(test_fields_match(here::here(bad_dir,"data_metadata_mismatch", "BICY_columns")), + "Column mismatch between data and metadata\\W*Mini_BICY_Veg_Geography\\.csv\\W*Missing from metadata: decimalLatitude\\W*Mini_BICY_Veg_Intercept_Cleaned\\.csv\\W*Missing from data file: vernacularName\\W*Mini_BICY_Veg_Transect_Cleaned\\.csv\\W*: Metadata column order does not match data column order$") + expect_error(test_fields_match(here::here(bad_dir, "data_metadata_mismatch", "BUIS_columns")), + "Column mismatch between data and metadata.*BUIS_herps.csv.*Missing from metadata.*genus.*Missing from data file.*family") + +}) + + # ---- test_numeric_fields ---- +test_that("test_numeric_fields displays success message if columns reported as numeric in the metadata can be parsed as numbers", { + expect_message(test_numeric_fields(here::here(good_dir, "BICY_good")), + "Columns indicated as numeric in metadata contain only numeric values and valid missing value codes") + expect_message(test_numeric_fields(here::here(good_dir, "BUIS_good")), + "Columns indicated as numeric in metadata contain only numeric values and valid missing value codes") + +}) + +test_that("test_numeric_fields displays error message if columns reported as numeric in metadata cannot be parsed as numbers", { + expect_error(test_numeric_fields(here::here(bad_dir,"bad_data_types", "BICY")), + "Columns indicated as numeric in metadata contain non-numeric values:\\W*Mini_BICY_Veg_Intercept_Cleaned.csv\\W*: custom_Transect\\W*Mini_BICY_Veg_Transect_Cleaned.csv\\W*: individualCount$") + expect_error(test_numeric_fields(here::here(bad_dir, "bad_data_types", "BUIS")), + "Columns indicated as numeric in metadata contain non-numeric values:\\W*BUIS_herps.csv\\W*: coordinateUncertaintyInMeters$") +}) + # ---- test_date_range ---- +test_that("test_date_range displays success message if dates in data match temporal coverage in metadata", { + expect_message(test_date_range(here::here(good_dir, "BICY_good")), + "Columns indicated as date/time in metadata are within the stated temporal coverage range") + expect_message(test_date_range(here::here(good_dir, "BUIS_good")), + "Columns indicated as date/time in metadata are within the stated temporal coverage range.") + +}) + +test_that("test_date_range displays error message if dates in data fail to parse", { + expect_error(test_date_range(here::here(bad_dir,"bad_data_types", "BICY")), + "The following date/time columns are out of the range \\W*2002-04-08\\W*2006-06-24\\W* specified in the metadata:\\W*Mini_BICY_Veg_Intercept_Cleaned.csv\\W*: eventDate \\(partially failed to parse\\)\\W*Mini_BICY_Veg_Transect_Cleaned.csv\\W*: eventDate \\(failed to parse\\)$") +}) + +test_that("test_date_range displays warning message if dates in data are outside temporal coverage range", { + expect_warning(test_date_range(here::here(bad_dir,"bad_data_types", "BUIS")), + "The following date/time columns are out of the range \\W*2001-06-20\\W*2001-10-20\\W* specified in the metadata:\\W*BUIS_herps.csv\\W*: eventDate \\W*2001-06-20\\W*2020-10-18\\W*$") +}) + # ---- convert_datetime_format ---- +test_that("convert_datetime_format returns the correct R datetime format string for ISO compliant date formats", { + expect_equal(convert_datetime_format("YYYY-MM-DD"), "%Y-%m-%d") + expect_equal(convert_datetime_format("YYYY-MM-DDThh:mm:ss"), "%Y-%m-%dT%H:%M:%S") +}) From 4862a434045933fba3341f04c15c125bbffae0a8 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 12:24:05 -0700 Subject: [PATCH 43/60] Fix tests --- ...data.xml => Example_BICY_Veg_metadata.xml} | 2 +- .../BUIS_herps_EMLeditor_metadata.xml | 2 +- ...data.xml => Example_BICY_Veg_metadata.xml} | 0 .../Example_BICY_Veg_metadata.xml | 16878 ++++++++++++++++ .../Example_BICY_Veg_metadata.xml | 16878 ++++++++++++++++ .../BUIS_herps_EMLeditor_metadata.xml | 1037 + ...data.xml => Example_BICY_Veg_metadata.xml} | 0 ...data.xml => Example_BICY_Veg_metadata.xml} | 0 ...data.xml => Example_BICY_Veg_metadata.xml} | 0 .../BUIS_herps_EMLeditor_metadata.xml | 2 +- tests/testthat/test-tabular_data_congruence.R | 31 +- 11 files changed, 34817 insertions(+), 13 deletions(-) rename tests/testthat/bad/BICY_bad/{(POST-EDITOR) Example_BICY_Veg_metadata.xml => Example_BICY_Veg_metadata.xml} (99%) rename tests/testthat/bad/bad_data_types/BICY/{(POST-EDITOR) Example_BICY_Veg_metadata.xml => Example_BICY_Veg_metadata.xml} (100%) create mode 100644 tests/testthat/bad/bad_versions/mismatch_error/Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/bad_versions/mismatch_warn/Example_BICY_Veg_metadata.xml create mode 100644 tests/testthat/bad/bad_versions/not_a_version/BUIS_herps_EMLeditor_metadata.xml rename tests/testthat/bad/data_metadata_mismatch/BICY_columns/{(POST-EDITOR) Example_BICY_Veg_metadata.xml => Example_BICY_Veg_metadata.xml} (100%) rename tests/testthat/bad/data_metadata_mismatch/BICY_files/{(POST-EDITOR) Example_BICY_Veg_metadata.xml => Example_BICY_Veg_metadata.xml} (100%) rename tests/testthat/good/BICY_good/{(POST-EDITOR) Example_BICY_Veg_metadata.xml => Example_BICY_Veg_metadata.xml} (100%) diff --git a/tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/BICY_bad/Example_BICY_Veg_metadata.xml similarity index 99% rename from tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/bad/BICY_bad/Example_BICY_Veg_metadata.xml index f3c8c8a..7e3c362 100644 --- a/tests/testthat/bad/BICY_bad/(POST-EDITOR) Example_BICY_Veg_metadata.xml +++ b/tests/testthat/bad/BICY_bad/Example_BICY_Veg_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295086 EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) diff --git a/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml index 2313374..f249e99 100644 --- a/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml +++ b/tests/testthat/bad/BUIS_bad/BUIS_herps_EMLeditor_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295037 Buck Island Reef National Monument Herpetofauna Inventories diff --git a/tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/bad_data_types/BICY/Example_BICY_Veg_metadata.xml similarity index 100% rename from tests/testthat/bad/bad_data_types/BICY/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/bad/bad_data_types/BICY/Example_BICY_Veg_metadata.xml diff --git a/tests/testthat/bad/bad_versions/mismatch_error/Example_BICY_Veg_metadata.xml b/tests/testthat/bad/bad_versions/mismatch_error/Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..2e1cbb1 --- /dev/null +++ b/tests/testthat/bad/bad_versions/mismatch_error/Example_BICY_Veg_metadata.xml @@ -0,0 +1,16878 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 2 + \n + column + + ,, + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + \n + column + + .. + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/bad_versions/mismatch_warn/Example_BICY_Veg_metadata.xml b/tests/testthat/bad/bad_versions/mismatch_warn/Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..592b04d --- /dev/null +++ b/tests/testthat/bad/bad_versions/mismatch_warn/Example_BICY_Veg_metadata.xml @@ -0,0 +1,16878 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 2 + \n + column + + ,, + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + \n + column + + .. + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/tests/testthat/bad/bad_versions/not_a_version/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/bad/bad_versions/not_a_version/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..f249e99 --- /dev/null +++ b/tests/testthat/bad/bad_versions/not_a_version/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1037 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BICY_columns/Example_BICY_Veg_metadata.xml similarity index 100% rename from tests/testthat/bad/data_metadata_mismatch/BICY_columns/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/bad/data_metadata_mismatch/BICY_columns/Example_BICY_Veg_metadata.xml diff --git a/tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/bad/data_metadata_mismatch/BICY_files/Example_BICY_Veg_metadata.xml similarity index 100% rename from tests/testthat/bad/data_metadata_mismatch/BICY_files/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/bad/data_metadata_mismatch/BICY_files/Example_BICY_Veg_metadata.xml diff --git a/tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml b/tests/testthat/good/BICY_good/Example_BICY_Veg_metadata.xml similarity index 100% rename from tests/testthat/good/BICY_good/(POST-EDITOR) Example_BICY_Veg_metadata.xml rename to tests/testthat/good/BICY_good/Example_BICY_Veg_metadata.xml diff --git a/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml index a3fcfb8..0db4556 100644 --- a/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml +++ b/tests/testthat/good/BUIS_good/BUIS_herps_EMLeditor_metadata.xml @@ -1,5 +1,5 @@ - + doi: https://doi.org/10.57830/2295037 Buck Island Reef National Monument Herpetofauna Inventories diff --git a/tests/testthat/test-tabular_data_congruence.R b/tests/testthat/test-tabular_data_congruence.R index 94260d9..0e69ab6 100644 --- a/tests/testthat/test-tabular_data_congruence.R +++ b/tests/testthat/test-tabular_data_congruence.R @@ -1,5 +1,7 @@ -good_dir <- here::here("tests", "testthat", "good") -bad_dir <- here::here("tests", "testthat", "bad") +# good_dir <- here::here("tests", "testthat", "good") +# bad_dir <- here::here("tests", "testthat", "bad") +good_dir <- "good" +bad_dir <- "bad" # ---- load_metadata ---- @@ -39,19 +41,28 @@ test_that("load_metadata throws an error when there are multiple xml files with # ---- test_metadata_version ---- test_that("test_metadata_version displays success message for supported EML versions", { expect_message(test_metadata_version(load_metadata(here::here(good_dir, "BICY_good"))), - "Your EML version 2.2.0 is supported.") + "Your EML version is supported") expect_message(test_metadata_version(load_metadata(here::here(good_dir, "BUIS_good"))), - "Your EML version 2.2.3 is supported.") + "Your EML version is supported") }) -test_that("test_metadata_version throws error and displays failure message for unsupported EML versions", { - expect_error(test_metadata_version(load_metadata(here::here(bad_dir, "BICY_bad"))), - "Unsupported EML version: EML must be 2.2.0 or later. Your version is 2.1.0.") +test_that("test_metadata_version throws warning when there is a mismatch between EML namespace and schema versions and at least one is too old", { + expect_warning( + expect_warning(test_metadata_version(load_metadata(here::here(bad_dir, "bad_versions", "mismatch_warn"))), + "There is a mismatch"), + "You are using an old EML version") +}) + +test_that("test_metadata_version throws warning then error when there is a mismatch between EML namespace and schema versions and at least one is too new", { + expect_error( + expect_warning(test_metadata_version(load_metadata(here::here(bad_dir, "bad_versions", "mismatch_error"))), + "There is a mismatch"), + "You are using an unsupported EML version") }) test_that("test_metadata_version throws error for invalid EML versions", { - expect_error(test_metadata_version(load_metadata(here::here(bad_dir, "BUIS_bad")))) + expect_error(test_metadata_version(load_metadata(here::here(bad_dir, "bad_versions", "not_a_version")))) }) @@ -130,9 +141,9 @@ test_that("test_dup_meta_entries displays success message if no duplicate files }) test_that("test_dup_meta_entries displays error message if metadata contains duplicate filenames", { - expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir,"data_metadata_mismatch", "BICY"))), + expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir,"data_metadata_mismatch", "BICY_files"))), "Metadata file name check failed. Some filenames are used more than once in the metadata:.*Mini_BICY_Veg_Transect_Cleaned.csv.*Mini_BICY_Veg_Intercept_Cleaned.csv$") - expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir, "data_metadata_mismatch", "BUIS"))), + expect_error(test_dup_meta_entries(load_metadata(here::here(bad_dir, "data_metadata_mismatch", "BUIS_files"))), "Metadata file name check failed. Some filenames are used more than once in the metadata:.*BUIS_herps.csv$") }) From 06398679d03d65732aca9ed812d192161a89e456 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 12:25:11 -0700 Subject: [PATCH 44/60] Fix R CMD check issues, add github actions for test coverage, R CMD check, and pkgdown --- .Rbuildignore | 2 + .github/.gitignore | 1 + .github/workflows/R-CMD-check.yaml | 49 + .github/workflows/pkgdown.yaml | 46 + DESCRIPTION | 8 +- NAMESPACE | 1 + R/tabular_data_congruence.R | 88 +- README.md | 4 + codecov.yml | 14 + .../BICY_veg/Example_BICY_Veg_metadata.xml | 16888 ++++++++++++++++ .../BICY_veg/Mini_BICY_Veg_Geography.csv | 1001 + .../Mini_BICY_Veg_Intercept_Cleaned.csv | 501 + .../Mini_BICY_Veg_Transect_Cleaned.csv | 501 + inst/extdata/BUIS_herps/BUIS_herps.csv | 47 + .../BUIS_herps_EMLeditor_metadata.xml | 1040 + inst/extdata/README.txt | 1 + man/DPchecker_example.Rd | 21 + man/load_data.Rd | 3 +- man/load_metadata.Rd | 3 +- man/test_date_range.Rd | 3 +- man/test_delimiter.Rd | 3 +- man/test_dup_meta_entries.Rd | 3 +- man/test_fields_match.Rd | 3 +- man/test_file_name_match.Rd | 3 +- man/test_footer.Rd | 3 +- man/test_header_num.Rd | 3 +- man/test_metadata_version.Rd | 3 +- man/test_numeric_fields.Rd | 3 +- man/test_validate_schema.Rd | 3 +- run_all_tests.R | 26 - 30 files changed, 20215 insertions(+), 60 deletions(-) create mode 100644 .github/.gitignore create mode 100644 .github/workflows/R-CMD-check.yaml create mode 100644 .github/workflows/pkgdown.yaml create mode 100644 codecov.yml create mode 100644 inst/extdata/BICY_veg/Example_BICY_Veg_metadata.xml create mode 100644 inst/extdata/BICY_veg/Mini_BICY_Veg_Geography.csv create mode 100644 inst/extdata/BICY_veg/Mini_BICY_Veg_Intercept_Cleaned.csv create mode 100644 inst/extdata/BICY_veg/Mini_BICY_Veg_Transect_Cleaned.csv create mode 100644 inst/extdata/BUIS_herps/BUIS_herps.csv create mode 100644 inst/extdata/BUIS_herps/BUIS_herps_EMLeditor_metadata.xml create mode 100644 inst/extdata/README.txt create mode 100644 man/DPchecker_example.Rd delete mode 100644 run_all_tests.R diff --git a/.Rbuildignore b/.Rbuildignore index b9377c2..b13ccae 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -2,3 +2,5 @@ ^\.Rproj\.user$ ^DPchecker\.Rproj$ ^LICENSE\.md$ +^\.github$ +^codecov\.yml$ diff --git a/.github/.gitignore b/.github/.gitignore new file mode 100644 index 0000000..2d19fc7 --- /dev/null +++ b/.github/.gitignore @@ -0,0 +1 @@ +*.html diff --git a/.github/workflows/R-CMD-check.yaml b/.github/workflows/R-CMD-check.yaml new file mode 100644 index 0000000..a3ac618 --- /dev/null +++ b/.github/workflows/R-CMD-check.yaml @@ -0,0 +1,49 @@ +# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples +# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help +on: + push: + branches: [main, master] + pull_request: + branches: [main, master] + +name: R-CMD-check + +jobs: + R-CMD-check: + runs-on: ${{ matrix.config.os }} + + name: ${{ matrix.config.os }} (${{ matrix.config.r }}) + + strategy: + fail-fast: false + matrix: + config: + - {os: macos-latest, r: 'release'} + - {os: windows-latest, r: 'release'} + - {os: ubuntu-latest, r: 'devel', http-user-agent: 'release'} + - {os: ubuntu-latest, r: 'release'} + - {os: ubuntu-latest, r: 'oldrel-1'} + + env: + GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} + R_KEEP_PKG_SOURCE: yes + + steps: + - uses: actions/checkout@v3 + + - uses: r-lib/actions/setup-pandoc@v2 + + - uses: r-lib/actions/setup-r@v2 + with: + r-version: ${{ matrix.config.r }} + http-user-agent: ${{ matrix.config.http-user-agent }} + use-public-rspm: true + + - uses: r-lib/actions/setup-r-dependencies@v2 + with: + extra-packages: any::rcmdcheck + needs: check + + - uses: r-lib/actions/check-r-package@v2 + with: + upload-snapshots: true diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml new file mode 100644 index 0000000..087f0b0 --- /dev/null +++ b/.github/workflows/pkgdown.yaml @@ -0,0 +1,46 @@ +# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples +# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help +on: + push: + branches: [main, master] + pull_request: + branches: [main, master] + release: + types: [published] + workflow_dispatch: + +name: pkgdown + +jobs: + pkgdown: + runs-on: ubuntu-latest + # Only restrict concurrency for non-PR jobs + concurrency: + group: pkgdown-${{ github.event_name != 'pull_request' || github.run_id }} + env: + GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} + steps: + - uses: actions/checkout@v3 + + - uses: r-lib/actions/setup-pandoc@v2 + + - uses: r-lib/actions/setup-r@v2 + with: + use-public-rspm: true + + - uses: r-lib/actions/setup-r-dependencies@v2 + with: + extra-packages: any::pkgdown, local::. + needs: website + + - name: Build site + run: pkgdown::build_site_github_pages(new_process = FALSE, install = FALSE) + shell: Rscript {0} + + - name: Deploy to GitHub pages 🚀 + if: github.event_name != 'pull_request' + uses: JamesIves/github-pages-deploy-action@v4.4.1 + with: + clean: false + branch: gh-pages + folder: docs diff --git a/DESCRIPTION b/DESCRIPTION index b15d3d1..7d0e3d1 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -13,21 +13,21 @@ Encoding: UTF-8 Roxygen: list(markdown = TRUE) RoxygenNote: 7.2.1 Suggests: + covr, + here, testthat (>= 3.0.0) Config/testthat/edition: 3 Imports: arcticdatautils (>= 0.7.0), - crayon, - here, EML, readr, magrittr, - tidyselect, lubridate, EMLeditor (>= 0.0.1.0), cli, dplyr, purrr, - stringr + stringr, + tibble Remotes: nationalparkservice/EMLeditor diff --git a/NAMESPACE b/NAMESPACE index 4d72424..30011ee 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,5 +1,6 @@ # Generated by roxygen2: do not edit by hand +export(DPchecker_example) export(convert_datetime_format) export(load_data) export(load_metadata) diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 7f2a6a7..6b3ffc9 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -11,7 +11,8 @@ #' @export #' #' @examples -#' my_metadata <- load_metadata() +#' data_pkg_dir <- DPchecker_example("BICY_veg") +#' my_metadata <- load_metadata(data_pkg_dir) #' load_metadata <- function(directory = here::here(), inform_success = FALSE) { # get list of all files ending in metadata.xml @@ -65,7 +66,9 @@ load_metadata <- function(directory = here::here(), inform_success = FALSE) { #' @return a tibble of .csvs #' @export #' -#' @examples my_data <- load_data() +#' @examples +#' data_pkg_dir <- DPchecker_example("BICY_veg") +#' my_data <- load_data(data_pkg_dir) load_data <- function(directory = here::here()) { data_filenames <- list.files(path = directory, pattern = ".csv") tibble_list <- sapply(data_filenames, @@ -89,18 +92,37 @@ load_data <- function(directory = here::here()) { #' @export #' #' @examples -#' test_metadata_version() +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_metadata_version(meta) test_metadata_version <- function(metadata = load_metadata(here::here())) { - vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", metadata)[1], 1, 5) - tryCatch(vers <- numeric_version(vers), + # Declaring oldest and newest accepted versions here so that they're easier to update + oldest_accepted_ver <- "2.2.0" + newest_accepted_ver <- "2.2.0" + + # vers <- substr(sub(".*https://eml.ecoinformatics.org/eml-", "", metadata)[1], 1, 5) + vers <- c(EML::eml_get(metadata, "eml")[[1]], + unlist(strsplit(EML::eml_get(metadata, "schemaLocation")[[1]], "\\s"))[1]) + vers <- vers %>% + stringr::str_extract("eml-\\d+\\.\\d+(\\.\\d+)?") %>% + stringr::str_replace("eml-", "") + + tryCatch({ns_ver <- numeric_version(vers[1]) + schema_ver <- numeric_version(vers[2])}, error = function(err) { cli::cli_abort(c("x" = err$message)) }) - if (vers < "2.2.0") { - cli::cli_abort(c("x" = "Unsupported EML version: EML must be 2.2.0 or later. Your version is {.val {vers}}.")) - } else { # vers >= 2.2.0 - cli::cli_inform(c("v" = "Your EML version {.val {vers}} is supported.")) + + # Check that both namespace and schema versions are within accepted range + if (ns_ver != schema_ver) { + cli::cli_warn(c("!" = "There is a mismatch between your namespace version ({.val {ns_ver}}) and your schema version ({.val {schema_ver}}).")) + } + if (ns_ver < oldest_accepted_ver || schema_ver < oldest_accepted_ver) { + cli::cli_warn(c("!" = "You are using an old EML version: {oldest_accepted_ver} or later is recommended.")) + } else if (ns_ver > newest_accepted_ver || schema_ver > newest_accepted_ver) { + cli::cli_abort(c("x" = "You are using an unsupported EML version: versions beyond {newest_accepted_ver} not accepted.")) + } else { + cli::cli_inform(c("v" = "Your EML version is supported.")) } return(invisible(metadata)) @@ -119,7 +141,8 @@ test_metadata_version <- function(metadata = load_metadata(here::here())) { #' @export #' #' @examples -#' test_validate_schema() +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_validate_schema(meta) test_validate_schema <- function(metadata = load_metadata(here::here())) { val <- EML::eml_validate(metadata) @@ -154,7 +177,8 @@ test_validate_schema <- function(metadata = load_metadata(here::here())) { #' @export #' #' @examples -#' test_footer() +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_footer(meta) test_footer <- function(metadata = load_metadata(here::here())) { if (is.null(arcticdatautils::eml_get_simple(metadata, "numFooterLines"))) { @@ -179,7 +203,8 @@ test_footer <- function(metadata = load_metadata(here::here())) { #' @export #' #' @examples -#' test_header_num() +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_header_num(meta) test_header_num <- function(metadata = load_metadata(here::here())) { tbl_metadata <- EML::eml_get(metadata, "dataTable") @@ -221,7 +246,8 @@ test_header_num <- function(metadata = load_metadata(here::here())) { #' @export #' #' @examples -#' test_delimiter() +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_delimiter(meta) test_delimiter <- function(metadata = load_metadata(here::here())) { tbl_metadata <- EML::eml_get(metadata, "dataTable") @@ -269,7 +295,9 @@ test_delimiter <- function(metadata = load_metadata(here::here())) { #' @return Invisibly returns `metadata`. #' @export #' -#' @examples test_dup_meta_entries() +#' @examples +#' meta <- load_metadata(DPchecker_example("BICY_veg")) +#' test_dup_meta_entries(meta) test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { @@ -305,7 +333,9 @@ test_dup_meta_entries <- function(metadata = load_metadata(here::here())) { #' #' @return Invisibly returns `metadata`. #' @export -#' @examples test_file_name_match() +#' @examples +#' dir <- DPchecker_example("BICY_veg") +#' test_file_name_match(dir) test_file_name_match <- function(directory = here::here(), metadata = load_metadata(directory)) { # get physical elements (and all children elements) @@ -352,7 +382,8 @@ test_file_name_match <- function(directory = here::here(), metadata = load_metad #' @export #' #' @examples -#' test_fields_match() +#' dir <- DPchecker_example("BICY_veg") +#' test_fields_match(dir) test_fields_match <- function(directory = here::here(), metadata = load_metadata(directory)) { # get dataTable and all children elements @@ -427,7 +458,8 @@ test_fields_match <- function(directory = here::here(), metadata = load_metadata #' @export #' #' @examples -#' test_numeric_fields() +#' dir <- DPchecker_example("BICY_veg") +#' test_numeric_fields(dir) test_numeric_fields <- function(directory = here::here(), metadata = load_metadata(directory)) { # get dataTable and all children elements @@ -511,7 +543,8 @@ test_numeric_fields <- function(directory = here::here(), metadata = load_metada #' @export #' #' @examples -#' test_date_range() +#' dir <- DPchecker_example("BICY_veg") +#' test_date_range(dir) test_date_range <- function(directory = here::here(), metadata = load_metadata(directory)) { # get dataTable and all children elements @@ -631,6 +664,25 @@ test_date_range <- function(directory = here::here(), metadata = load_metadata(d return(invisible(metadata)) } +#' Generate path to example data +#' +#' @param dp_name Name of data package. If omitted, this function will list all available example data packages. +#' +#' @return Path to example data, if dp_name is specified, or all available example data if not. +#' @export +#' +#' @examples +#' DPchecker_example() +#' DPchecker_example("BUIS_herps") +DPchecker_example <- function(dp_name = NULL) { + if (is.null(dp_name)) { + dir(system.file("extdata", package = "DPchecker")) + } else { + message("Data are provided for example use only. Do not assume that they are complete, accurate, or up to date.") + system.file("extdata", dp_name, package = "DPchecker", mustWork = TRUE) + } +} + #' Convert EML date/time format string to one that R can parse #' diff --git a/README.md b/README.md index faf365b..4a36f6c 100644 --- a/README.md +++ b/README.md @@ -4,6 +4,10 @@ #### v0.0.0.9000 + + [![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) + + DPchecker (Data Package checker) is a package with a series of functions for NPS data package authors and reviewers to check for internal consistency among data/meta data and with the data package standards. Currently, *only EML metadata and .csv data files* are supported. All data files and the single metadata file (named *_metadata.xml) must be in the same directory. diff --git a/codecov.yml b/codecov.yml new file mode 100644 index 0000000..04c5585 --- /dev/null +++ b/codecov.yml @@ -0,0 +1,14 @@ +comment: false + +coverage: + status: + project: + default: + target: auto + threshold: 1% + informational: true + patch: + default: + target: auto + threshold: 1% + informational: true diff --git a/inst/extdata/BICY_veg/Example_BICY_Veg_metadata.xml b/inst/extdata/BICY_veg/Example_BICY_Veg_metadata.xml new file mode 100644 index 0000000..10920ad --- /dev/null +++ b/inst/extdata/BICY_veg/Example_BICY_Veg_metadata.xml @@ -0,0 +1,16888 @@ + + + + doi: https://doi.org/10.57830/2295086 + EXAMPLE: A Quantitative Plant Inventory of Big Cypress National Preserve: Processed Data (Publicly Available) + + + Issac + A + Quevedo + + NPS + issac_quevedo@partner.nps.gov + https://orcid.org/0000-0003-0129-981X + + + SFCN + + + IMD + + + + Robert + L + Baker + + NPS + robert_baker@nps.gov + https://orcid.org/0000-0001-7591-5035 + Contributor + + 2022-11-11 + eng + + "A quantitative plant inventory was conducted between the years of 2002 and 2004 by the Institute for Regional Conservation (IRC) on the 295,100 ha Big Cypress National Preserve in southern Florida. The goal of the study was to document at least 90% of plant taxa in the preserve. Abundance was measured on three hundred, 1 km x 1 km, sample stations; two, 250 m, transects per station; intercept points spaced 2.5 m along transects; as well as sixty, 500 m, roadside belt transects. 1094 unique plant taxa, both previously known and unknown, were documented. The data has been processed for dissemination by the Inverntory and Monitoring Division (IMD), complying with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013). Four tabular datasets have been created using the raw data provided from the park, following Darwin Core naming standards and introducing data quality flagging where data was missing or unclear."&#13; + + + + vegetation + plant + taxonomy + species + inventory + transect + survey + LTER Controlled Vocabulary + + + npspecies + intercept + belt + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + NPS Unit Connections: BICY + + -80.8267 + -81.3835 + 26.2593 + 25.6152 + + + + BICY + + -80.9777691883015 + -80.9777691883015 + 25.7898999866714 + 25.7898999866714 + + + + + + 2002-04-08 + + + 2006-06-24 + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum monostachyum + 41030 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Chrysobalanaceae + 25356 + + genus + Chrysobalanus + 25147 + + species + Chrysobalanus icaco + icaco + coco plum + 25148 + + + + + + + + + + + + + + species + Myrica cerifera + southern bayberry + wax myrtle + 19261 + + + variety + Dichanthelium ensifolium var. unciphyllum + 534434 + + + species + Taxodium ascendens + pond cypress + pondcypress + 183433 + + + species + Sarcostemma clausum + 30403 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Blechnum + midsorus fern + 17862 + + species + Blechnum serrulatum + toothed midsorus fern + 17864 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Myrtaceae + myrtles + 27172 + + genus + Eugenia + eugenias + stoppers + 27192 + + species + Eugenia axillaris + white stopper + 27199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris interrupta + Willdenow's maiden fern + 17257 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Oleaceae + olives + 32927 + + genus + Fraxinus + ash + 32928 + + species + Fraxinus caroliniana + Carolina ash + 32941 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Sabal + palmetto + 42502 + + species + Sabal palmetto + cabbage palmetto + cabbage palm + 42506 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Arecales + 42431 + + family + Arecaceae + 500043 + + genus + Serenoa + serenoa + 42507 + + species + Serenoa repens + saw palmetto + 42508 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Annonaceae + custard apples + 18092 + + genus + Annona + 18095 + + species + Annona glabra + pond apple + 18101 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum hemitomon + 40909 + + + + + + + + + + + + + + species + Rapanea punctata + Florida rapanea + 23895 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cladium + sawgrass + 39877 + + species + Cladium jamaicense + Jamaica swamp sawgrass + 39878 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Spartina + 41266 + + species + Spartina bakeri + 41273 + + + + + + + + + + + + + + species + Panicum tenerum + bluejoint panicum + bluejoint panicgrass + blue-joint panicgrass + 40958 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Toxicodendron + poison ivy + poison oak + 28818 + + species + Toxicodendron radicans + poison ivy + eastern poison ivy + 28821 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa caroliniana + blue waterhyssop + 33039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Pinopsida + conifers + 500009 + + subclass + Pinidae + 954916 + + order + Pinales + pines + 500028 + + family + Cupressaceae + cypress + redwood + 18042 + + genus + Taxodium + cypress + bald cypress + 18040 + + species + Taxodium distichum + baldcypress + bald cypress + 18041 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis cellulosa + Gulf Coast spikerush + 40036 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Cirsium + thistle + 36334 + + species + Cirsium horridulum + yellow thistle + 36379 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Salicaceae + willows + 22443 + + genus + Salix + willow + 22476 + + species + Salix caroliniana + coastal plain willow + 22516 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis glomeruliflora + silverling + 35689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum virgatum + old switch panic grass + 40913 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia repens + creeping primrose-willow + 27362 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Sapindaceae + soapberries + 28657 + + genus + Acer + maples + 28727 + + species + Acer rubrum + red maple + 28728 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Amphicarpum + 41383 + + species + Amphicarpum muhlenbergianum + 782171 + + + + + + + + + + + + + + species + Pluchea rosea + 36067 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus pumila + running oak + 195183 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia succulenta + Carolina wild petunia + 520617 + + + + + + + + + + + + + + species + Piriqueta caroliniana + 22210 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis exaltata + Boston swordfern + 17605 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Blechnaceae + Chain Ferns + Deer Ferns + Blechnoids + 17861 + + genus + Woodwardia + chain fern + chainfern + 17748 + + species + Woodwardia virginica + Virginia chainfern + 17751 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Persea + bay + 18148 + + species + Persea palustris + swamp bay + 504254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora divergens + spreading beaksedge + 40167 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys glauca + 41741 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia microcarpa + smallfruit primrose-willow + 27353 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora microcarpa + southern beaksedge + 40186 + + + + + + + + + + + + + + species + Aster elliottii + 509275 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Centella + 29611 + + species + Centella asiatica + spadeleaf + 29612 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora inundata + narrowfruit horned beaksedge + 40182 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis rotundifolia + muscadine + muscadine grape + 28609 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax auriculata + earleaf greenbrier + wild-bamboo + 43349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora corniculata + shortbristle horned beaksedge + 40146 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Laurales + 500025 + + family + Lauraceae + laurels + 18145 + + genus + Cassytha + 18172 + + species + Cassytha filiformis + devil's gut + 18173 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Schinus + peppertree + 28809 + + species + Schinus terebinthifolius + Brazilian pepper-tree + Christmas berry + Florida holly + warui + Christmasberry + Brazilian peppertree + 28812 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Muhlenbergia + 41883 + + species + Muhlenbergia capillaris + 41902 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus virginiana + live oak + 19283 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Cyperus + flatsedge + 39882 + + species + Cyperus haspan + haspan flatsedge + 39930 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon compressum + flattened pipewort + 39198 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Rhizophoraceae + mangroves + 27789 + + genus + Rhizophora + mangrove + 27790 + + species + Rhizophora mangle + American mangrove + red mangrove + 27791 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Crinum + swamplily + 182708 + + species + Crinum americanum + seven sisters + 182710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Saxifraganae + 846550 + + order + Saxifragales + 846633 + + family + Haloragaceae + water milfoil + 27033 + + genus + Proserpinaca + mermaidweed + 27048 + + species + Proserpinaca palustris + marsh mermaid-weed + marsh mermaidweed + 27049 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Lomariopsidaceae + fringedferns + 897571 + + genus + Nephrolepis + swordfern + Boston fern + 17601 + + species + Nephrolepis biserrata + giant swordfern + 17603 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia variabilis + leatherleaf airplant + 505514 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Phlebodium + golden polypody + 17655 + + species + Phlebodium aureum + golden polypody + 17656 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium leptophyllum + false fennel + 35991 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria baldwinii + Baldwin's nutrush + 40304 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia utriculata + spreading airplant + 42372 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia balbisiana + northern needleleaf + 42361 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mikanioides + semaphore thoroughwort + 35994 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Flaveria + yellowtops + 37375 + + species + Flaveria linearis + narrowleaf yellowtops + 502630 + + + + + + + + + + + + + + species + Panicum rigidulum + 40956 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Cannabaceae + hemp + 19118 + + genus + Celtis + hackberry + 19039 + + species + Celtis laevigata + sugar hackberry + sugarberry + 19042 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Mikania + hempvine + 36042 + + species + Mikania scandens + climbing hempvine + 36043 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Sida + fanpetals + 21725 + + species + Sida acuta + common wireweed + 21726 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora miliacea + millet beaksedge + 40188 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus laurifolia + laurel oak + 19368 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Solanaceae + nightshades + 30411 + + genus + Physalis + groundcherry + 30587 + + species + Physalis walteri + Walter's groundcherry + 504376 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora tracyi + Tracy's beaksedge + 40202 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia fasciculata + giant airplant + 42364 + + variety + Tillandsia fasciculata var. densispica + giant airplant + 530694 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Lyonia + lyonias + staggerbush + 23558 + + species + Lyonia fruticosa + coastal plain staggerbush + 23562 + + + + + + + + + + + + + + kingdom + Plantae + 6 + + phylum + Tracheophyta + 7707728 + + class + Liliopsida + 196 + + order + Poales + 1369 + + family + Juncaceae + 5353 + + genus + Juncus + 2701072 + + species + Juncus polycephalos + 7310303 + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Verbenaceae + verbenas + 32064 + + genus + Phyla + frogfruit + fogfruit + 32193 + + species + Phyla nodiflora + frog fruit + sawtooth fogfruit + turkey tangle + turkey tangle fogfruit + turkey tangle frogfruit + 32197 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Piloblephis + 500487 + + species + Piloblephis rigida + wild pennyroyal + 504397 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus chapmanii + Chapman's oak + 19310 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Lythraceae + loosestrife + 27074 + + genus + Cuphea + waxweed + 27094 + + species + Cuphea carthagenensis + Colombian waxweed + 27103 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Hydroleaceae + 835373 + + genus + Hydrolea + false fiddleleaf + 31382 + + species + Hydrolea corymbosa + skyflower + 31383 + + + + + + + + + + + + + + species + Dichanthelium erectifolium + 41660 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Hyptis + bushmint + 32522 + + species + Hyptis alata + clustered bushmint + 32523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Araceae + Arums + 42521 + + genus + Lemna + duckweed + 42588 + + species + Lemna obscura + little duckweed + 42593 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Nartheciaceae + 810128 + + genus + Aletris + colicroot + 42767 + + species + Aletris lutea + yellow colicroot + 42770 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Ruellia + wild petunia + 34371 + + species + Ruellia caroliniensis + Carolina wild petunia + 34373 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Lysiloma + false tamarind + 26771 + + species + Lysiloma latisiliquum + false tamarind + 503631 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum brachyphyllum + coastal plain St. Johnswort + 21428 + + + + + + + + + + + + + + species + Ocotea coriacea + lancewood + 503982 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago gigantea + giant goldenrod + 36259 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Vitis + grape + 28606 + + species + Vitis cinerea + sweet grape + graybark grape + 28615 + + variety + Vitis cinerea var. floridana + Florida grape + 530856 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Panicum + 40901 + + species + Panicum repens + 504106 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Cephalanthus + buttonbush + 34785 + + species + Cephalanthus occidentalis + buttonbush + common buttonbush + 34786 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Pleopeltis + scaly polypody + 17669 + + species + Pleopeltis polypodioides + resurrection fern + 504451 + + variety + Pleopeltis polypodioides var. michauxiana + resurrection fern + 897673 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Rhamnaceae + buckthorns + 28445 + + genus + Berchemia + supplejack + 28446 + + species + Berchemia scandens + Alabama supplejack + 28447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia purpurea + purple bladderwort + eastern purple bladderwort + 34461 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Caryophyllaceae + pinks + 19942 + + genus + Drymaria + drymary + 20281 + + species + Drymaria cordata + chickweed + whitesnow + 20282 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Cornales + 27788 + + family + Cornaceae + dogwoods + 27796 + + genus + Cornus + dogwood + 27798 + + species + Cornus foemina + stiff dogwood + swamp dogwood + 27802 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Euphorbiaceae + spurge + 28031 + + genus + Stillingia + toothleaf + 28409 + + species + Stillingia aquatica + water toothleaf + 28410 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pityopsis + silkgrass + 196340 + + species + Pityopsis graminifolia + narrowleaf silkgrass + 196349 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Salviniales + water ferns + heterosporous ferns + 18004 + + family + Salviniaceae + water ferns + floating ferns + 18010 + + genus + Salvinia + watermoss + 18011 + + species + Salvinia minima + water fern + water spangles + 181822 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Celastrales + 27931 + + family + Celastraceae + bittersweet + 27937 + + genus + Hippocratea + 27934 + + species + Hippocratea volubilis + medicine vine + 27936 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Avicennia + black mangrove + mangrove + 32136 + + species + Avicennia germinans + black mangrove + 32137 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum hypericoides + St. Andrew's cross + 503138 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Diodia + buttonweed + 34788 + + species + Diodia virginiana + Virginia buttonweed + 34790 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Combretaceae + combretums + 27755 + + genus + Conocarpus + mangrove + 27765 + + species + Conocarpus erectus + button mangrove + 27766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Helenium + sneezeweed + 36005 + + species + Helenium pinnatifidum + southeastern sneezeweed + 36019 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax bona-nox + saw greenbrier + 43341 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Encyclia + butterfly orchid + 43551 + + species + Encyclia tampensis + Tampa butterfly orchid + 43554 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Urticaceae + nettles + 19119 + + genus + Boehmeria + false nettle + 19120 + + species + Boehmeria cylindrica + small-spike false nettle + smallspike false nettle + 19121 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Hydrocharitaceae + frog's bit + tape-grass + waternymphs + 38935 + + genus + Hydrilla + 38973 + + species + Hydrilla verticillata + Florida elodea + water thyme + hydrilla + water-thyme + waterthyme + 38974 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sporobolus + 42115 + + species + Sporobolus virginicus + 42127 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium serotinum + lateflowering thoroughwort + 35981 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Polypodiaceae + common ferns + licorice ferns + 17226 + + genus + Campyloneurum + strapfern + 17425 + + species + Campyloneurum phyllitidis + long strapfern + 17429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Santalanae + 846549 + + order + Santalales + 27840 + + family + Ximeniaceae + 895563 + + genus + Ximenia + 27849 + + species + Ximenia americana + tallow wood + tallowwood + 27850 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris kunthii + Kunth's maiden fern + 17258 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Vitales + 846630 + + family + Vitaceae + grapes + 28600 + + genus + Parthenocissus + creeper + 28601 + + species + Parthenocissus quinquefolia + American ivy + fiveleaved ivy + woodbine + Virginia creeper + 28602 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Dyschoriste + snakeherb + 500252 + + species + Dyschoriste angusta + pineland snakeherb + 502189 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Saccharum + 42054 + + species + Saccharum giganteum + 504933 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Eriocaulaceae + pipewort + 39193 + + genus + Eriocaulon + pipewort + 39194 + + species + Eriocaulon ravenelii + Ravenel's pipewort + 39201 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Chamaecrista + sensitive pea + 500196 + + species + Chamaecrista fasciculata + partridge pea + sleepingplant + showy partridgepea + 501383 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena breviseta + saltmarsh umbrella-sedge + 40133 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Rosales + 24057 + + family + Moraceae + mulberries + 19063 + + genus + Ficus + fig + 19081 + + species + Ficus aurea + Florida strangler + Florida strangler fig + 19092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia setacea + southern needleleaf + 42370 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Ranunculanae + 846547 + + order + Ranunculales + 18409 + + family + Ranunculaceae + buttercups + crowfoot + 18410 + + genus + Clematis + leather flower + 18685 + + species + Clematis baldwinii + pine hyacinth + 18689 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago stricta + wand goldenrod + 36315 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus marginatus + grassleaf rush + 39289 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Gratiola + hedge hyssop + hedgehyssop + 33189 + + species + Gratiola ramosa + branched hedgehyssop + 33199 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Juncaceae + rushes + Rush Family + 39219 + + genus + Juncus + rush + 39220 + + species + Juncus megacephalus + bighead rush + 39291 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Coreopsis + tickseed + 37123 + + species + Coreopsis leavenworthii + Leavenworth's tickseed + 37141 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Stenotaphrum + 42156 + + species + Stenotaphrum secundatum + 42157 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia paucifolia + potbelly airplant + 505511 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum cistifolium + roundpod St. Johnswort + 21432 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Elytraria + scalystem + 182353 + + species + Elytraria caroliniensis + Carolina scalystem + 502286 + + variety + Elytraria caroliniensis var. angustifolia + Carolina scalystem + 527871 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis elliottii + 40720 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Iridaceae + 43190 + + genus + Sisyrinchium + blue-eyed grass + 43237 + + species + Sisyrinchium angustifolium + blueeyed grass + common blue-eyed grass + common blue-eyedgrass + blue-eyed grass + narrowleaf blue-eyed grass + 43240 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Passifloraceae + 22218 + + genus + Passiflora + passionflower + 22219 + + species + Passiflora suberosa + corky passionflower + devil's pumpkin + huehue haole + indigo berry + wild passionfruit + maypop + corkystem passionflower + 22232 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax tamnoides + bristly greenbrier + 43348 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis geniculata + Canada spikesedge + 40046 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Ipomoea + morningglory + morning-glory + 30758 + + species + Ipomoea sagittata + saltmarsh morning-glory + 30792 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Burseraceae + burseras + 28762 + + genus + Bursera + bursera + 28763 + + species + Bursera simaruba + West Indian birch + gumbo limbo + 28766 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Aristida + 41400 + + species + Aristida purpurascens + 41428 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Liliales + 42612 + + family + Smilacaceae + catbrier + 43339 + + genus + Smilax + common greenbriar + greenbriar + sarsaparilla + catbrier + greenbrier + 43340 + + species + Smilax laurifolia + laurel greenbrier + 43345 + + + + + + + + + + + + + + species + Spermacoce assurgens + woodland false buttonweed + 35244 + + + variety + Sagittaria graminea var. chapmanii + Chapman's arrowhead + 530206 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex lupuliformis + false hop sedge + 39412 + + + + + + + + + + + + + + species + Aster carolinianus + 35540 + + + species + Coelorachis rugosa + 41582 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Sapotaceae + sapodillas + sapotes + 23802 + + genus + Sideroxylon + bumelia + bully + 500559 + + species + Sideroxylon salicifolium + white bully + 505224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Magnoliales + 18065 + + family + Magnoliaceae + magnolias + 18068 + + genus + Magnolia + 18069 + + species + Magnolia virginiana + laurier doux + swamp-bay + sweetbay + 18070 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Hypericaceae + 822429 + + genus + Hypericum + St. Johnswort + 21416 + + species + Hypericum tetrapetalum + fourpetal St. Johnswort + 21463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eustachys + 41739 + + species + Eustachys petraea + 41743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Apocynaceae + dogbane + 30124 + + genus + Asclepias + milkweed + 30240 + + species + Asclepias tuberosa + butterfly milkweed + 30313 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Schizaeales + 846603 + + family + Anemiaceae + flowering ferns + 500039 + + genus + Anemia + 17974 + + species + Anemia adiantifolia + pineland fern + pine fern + 17975 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Sacciolepis + 41226 + + species + Sacciolepis indica + 41228 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Pterocaulon + blackroot + 38318 + + species + Pterocaulon pycnostachyum + dense-spike blackroot + 519743 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Fuirena + umbrella-sedge + 40130 + + species + Fuirena scirpoidea + southern umbrella-sedge + 40136 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Solanales + 500033 + + family + Convolvulaceae + morningglories + morning-glories + 30648 + + genus + Evolvulus + dwarf morningglory + dwarf morning-glory + 30843 + + species + Evolvulus sericeus + silky evolvulus + silver dwarf morningglory + silver dwarf morning-glory + 30849 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Dioscoreales + 810114 + + family + Burmanniaceae + 43384 + + genus + Burmannia + bluethread + 43387 + + species + Burmannia capitata + southern bluethread + 43389 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Boltonia + doll's daisy + 36852 + + species + Boltonia diffusa + smallhead doll's daisy + 36855 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium dichotomum + 41659 + + + + + + + + + + + + + + species + Chiococca parvifolia + pineland milkberry + 34959 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Carex + sedge species + sedges + sedge + 39369 + + species + Carex gigantea + giant sedge + 39394 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium commutatum + 41647 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Iva + marsh elder + iva + marshelder + sumpweed + 36024 + + species + Iva microcephala + piedmont marsh elder + 36039 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Schoenus + bogrush + 40300 + + species + Schoenus nigricans + black bogrush + 40302 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Solidago + goldenrod + 36223 + + species + Solidago fistulosa + pine barren goldenrod + 36254 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Primulaceae + primroses + 23929 + + genus + Ardisia + marlberry + 23888 + + species + Ardisia escallonioides + island marlberry + 836229 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalidium + 41996 + + species + Paspalidium geminatum + 41997 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum conjugatum + 41015 + + + + + + + + + + + + + + variety + Pteridium aquilinum var. pseudocaudatum + tailed bracken + western brackenfern + 529921 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia resupinata + northeastern bladderwort + lavender bladderwort + 34463 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium strigosum + 502039 + + variety + Dichanthelium strigosum var. glabrescens + 527703 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Magnolianae + 846543 + + order + Piperales + 18217 + + family + Saururaceae + lizard tails + 18219 + + genus + Saururus + 18220 + + species + Saururus cernuus + lizard's tail + 18221 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Bacopa + water hyssop + waterhyssop + 33037 + + species + Bacopa monnieri + herb-of-grace + coastal waterhyssop + herb of grace + 33038 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Myrtales + 27072 + + family + Onagraceae + evening primroses + 27279 + + genus + Ludwigia + seedbox + primrose-willow + 27334 + + species + Ludwigia alata + winged primrose-willow + 27338 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Phytolaccaceae + pokeweed + 19521 + + genus + Phytolacca + pokeweed + 19522 + + species + Phytolacca americana + pokeweed + inkberry + pigeonberry + pokeberry + common pokeweed + poke + American pokeweed + 19523 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis baldwinii + Baldwin's spikerush + 40029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Eragrostis + 40716 + + species + Eragrostis atrovirens + 40718 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Vigna + cowpea + 27015 + + species + Vigna luteola + hairypod cowpea + Dalrymple vigna + 27016 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Erigeron + fleabane + daisy + 35803 + + species + Erigeron quercifolius + oakleaf fleabane + 35940 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon glomeratus + 40454 + + variety + Andropogon glomeratus var. pumilus + 182522 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Bromeliaceae + 42330 + + genus + Tillandsia + air plant + airplant + 42359 + + species + Tillandsia usneoides + Spanish moss + 42371 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora colorata + starrush whitetop + 504777 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Oeceoclades + monk orchid + 43653 + + species + Oeceoclades maculata + monk orchid + 43654 + + + + + + + + + + + + + + species + Hedyotis uniflora + 514521 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Campanulaceae + harebells + 34471 + + genus + Lobelia + 34503 + + species + Lobelia glandulosa + glade lobelia + 34522 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Apiales + 500017 + + family + Apiaceae + 500042 + + genus + Oxypolis + cowbane + 29543 + + species + Oxypolis filiformis + water cowbane + 29547 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Loganiaceae + loganias + 29911 + + genus + Mitreola + hornpod + 500424 + + species + Mitreola petiolata + lax hornpod + 503858 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Alismatales + 38883 + + family + Alismataceae + arrowhead + water-plantain + 38890 + + genus + Sagittaria + arrowhead + 38903 + + species + Sagittaria lancifolia + bulltongue + scythefruit arrowhead + bulltongue arrowhead + 38923 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Zingiberales + 42381 + + family + Marantaceae + arrowroot + prayer-plant + 42420 + + genus + Thalia + alligatorflag + alligator-flag + 42427 + + species + Thalia geniculata + bent alligator-flag + 42429 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Thelypteridaceae + marsh ferns + 500085 + + genus + Thelypteris + marsh ferns + wood ferns + maiden fern + 17250 + + species + Thelypteris palustris + marsh fern + meadow fern + eastern marsh fern + 17251 + + variety + Thelypteris palustris var. pubescens + eastern marsh fern + 530656 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Commelinales + 39093 + + family + Pontederiaceae + pickerel-weed + 42614 + + genus + Pontederia + pontederia + pickerel-weed + pickerelweed + 42619 + + species + Pontederia cordata + pickerelweed + 42620 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Droseraceae + sundews + 22006 + + genus + Drosera + sundew + catch-fly + dew-threads + 22009 + + species + Drosera capillaris + pink sundew + 22011 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Polypodiidae + 846532 + + order + Polypodiales + 500029 + + family + Pteridaceae + maidenhair ferns + 500073 + + genus + Vittaria + shoestring ferns + 17730 + + species + Vittaria lineata + shoestring fern + 17731 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Ericales + 23443 + + family + Ericaceae + heaths + 23463 + + genus + Vaccinium + blueberries + huckleberry + blueberry + 23571 + + species + Vaccinium darrowii + Darrow's blueberry + 23590 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Polypodiophytina + 954903 + + class + Polypodiopsida + leptosporangiate ferns + 846528 + + subclass + Ophioglossidae + 846533 + + order + Psilotales + 17004 + + family + Psilotaceae + 17005 + + genus + Psilotum + whisk fern + 17006 + + species + Psilotum nudum + whisk fern + 17008 + + + + + + + + + + + + + + species + Aster bracei + 193313 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Amaryllidaceae + 182703 + + genus + Hymenocallis + spiderlily + 500341 + + species + Hymenocallis palmeri + alligatorlily + 503112 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Caryophyllanae + 846539 + + order + Caryophyllales + 19520 + + family + Cactaceae + cacti + 19685 + + genus + Opuntia + pricklypear + cholla + 19686 + + species + Opuntia humifusa + 19710 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malvales + 21500 + + family + Malvaceae + mallows + 21608 + + genus + Melochia + broom-wood + 21547 + + species + Melochia spicata + bretonica peluda + 503747 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Verbesina + crownbeard + 38594 + + species + Verbesina virginica + white crownbeard + 38613 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lamiaceae + mints + 32251 + + genus + Teucrium + germander + 32351 + + species + Teucrium canadense + wood sage + hairy germander + American germander + Canada germander + 32352 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Paspalum + 40990 + + species + Paspalum caespitosum + 40996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Acanthaceae + 34350 + + genus + Justicia + water-willow + 34351 + + species + Justicia angusta + pineland water-willow + 182329 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia subulata + zigzag bladderwort + 34465 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Dichanthelium + 41645 + + species + Dichanthelium laxiflorum + 41661 + + + + + + + + + + + + + + species + Sabatia bartramii + Bartram's rose gentian + 30007 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + species + Andropogon virginicus + 40456 + + variety + Andropogon virginicus var. glaucus + 182525 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Malpighiales + 822428 + + family + Phyllanthaceae + 845434 + + genus + Phyllanthus + leaf flower + leafflower + 28364 + + species + Phyllanthus caroliniensis + Carolina leaf-flower + 28368 + + subspecies + Phyllanthus caroliniensis ssp. saxicola + Carolina leaf-flower + 28370 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora fascicularis + fascicled beaksedge + 40169 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Pinguicula + butterwort + 34433 + + species + Pinguicula pumila + small butterwort + 34441 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium mohrii + Mohr's thoroughwort + 502518 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Galactia + milkpea + 26683 + + species + Galactia volubilis + downy milkpea + 26703 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Menyanthaceae + bog beans + 30895 + + genus + Nymphoides + floatingheart + 29995 + + species + Nymphoides aquatica + big floatingheart + 29996 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Eupatorium + thoroughwort + 35977 + + species + Eupatorium capillifolium + dogfennel + 35978 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fabales + 500022 + + family + Fabaceae + peas + legumes + 500059 + + genus + Erythrina + coraltrees + 26675 + + species + Erythrina herbacea + redcardinal + eastern coralbean + 26678 + + + + + + + + + + + + + + species + Polygala grandiflora + showy milkwort + 29336 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria ciliata + fringed nutrush + 40305 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Gentianaceae + gentians + 29962 + + genus + Sabatia + rose gentian + 30000 + + species + Sabatia stellaris + rose of Plymouth + 30004 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Baccharis + baccharis + 35681 + + species + Baccharis halimifolia + eastern baccharis + 35682 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Linderniaceae + 834076 + + genus + Lindernia + false pimpernel + 33220 + + species + Lindernia grandiflora + savannah false pimpernel + 33224 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia cornuta + horned bladderwort + 34447 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Lentibulariaceae + bladderworts + 34432 + + genus + Utricularia + bladderwort + 34443 + + species + Utricularia foliosa + leafy bladderwort + 34450 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Scleria + nutrush + 40303 + + species + Scleria verticillata + low nutrush + 40319 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Gentianales + 29910 + + family + Rubiaceae + madders + 34784 + + genus + Psychotria + wild coffee + 35090 + + species + Psychotria nervosa + Seminole balsamo + 35092 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Setaria + 41229 + + species + Setaria parviflora + 505191 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Eleocharis + spikerush + 40010 + + species + Eleocharis interstincta + knotted spikerush + 40048 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Aquifoliales + 835356 + + family + Aquifoliaceae + hollies + 27979 + + genus + Ilex + hollies + holly + 27980 + + species + Ilex cassine + dahoon + 27992 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Limnophila + marshweed + 33634 + + species + Limnophila sessiliflora + ambulia + Asian marshweed + 33635 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Xyridaceae + Yellow-eyed-grass Family + 39095 + + genus + Xyris + yellow-eyed-grass + yelloweyed grass + 39096 + + species + Xyris difformis + southern yelloweyed grass + bog yelloweyed grass + 39102 + + variety + Xyris difformis var. floridana + Florida yelloweyed grass + 530882 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Asparagales + 897479 + + family + Orchidaceae + orchids + 43397 + + genus + Polystachya + yellowspike orchid + 43683 + + species + Polystachya concreta + greater yellowspike orchid + 165838 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Axonopus + 41463 + + species + Axonopus furcatus + 41466 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Fagales + 19273 + + family + Fagaceae + 19275 + + genus + Quercus + oak + 19276 + + species + Quercus minima + dwarf live oak + 19377 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Mecardonia + 33644 + + species + Mecardonia acuminata + axilflower + 33645 + + variety + Mecardonia acuminata var. peninsularis + axilflower + 529113 + + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Cyperaceae + sedges + 39357 + + genus + Rhynchospora + beaksedge + 40144 + + species + Rhynchospora odorata + fragrant beaksedge + 40190 + + + + + + + + + + + + + + species + Harrisella porrecta + needleroot airplant orchid + 43602 + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Lamiales + 31632 + + family + Plantaginaceae + plantains + 32869 + + genus + Scoparia + licorice weed + 34028 + + species + Scoparia dulcis + licorice weed + 34029 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Phragmites + 41071 + + species + Phragmites australis + 41072 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Lilianae + monocots + monocotyledons + 846542 + + order + Poales + 846620 + + family + Poaceae + 40351 + + genus + Andropogon + 40450 + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Rosanae + 846548 + + order + Sapindales + 28643 + + family + Anacardiaceae + cashews + 28771 + + genus + Rhus + sumac + 28772 + + species + Rhus copallinum + flameleaf sumac + winged sumac + shining sumac + 504754 + + + + + + + + + + + + + + kingdom + Plantae + plants + 202422 + + subkingdom + Viridiplantae + green plants + 954898 + + infrakingdom + Streptophyta + land plants + 846494 + + superdivision + Embryophyta + 954900 + + division + Tracheophyta + vascular plants + tracheophytes + 846496 + + subdivision + Spermatophytina + spermatophytes + seed plants + 846504 + + class + Magnoliopsida + 18063 + + superorder + Asteranae + 846535 + + order + Asterales + 35419 + + family + Asteraceae + sunflowers + 35420 + + genus + Vernonia + ironweed + 38615 + + species + Vernonia blodgettii + Florida ironweed + 38625 + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + judd_patterson@nps.gov + https://orcid.org/0000-0002-0951-7917 + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + "Citation: Bradley KA, Woodmansee SW, Sadle JL, Gann GD. 2005. A quantitative plant inventory of the Big Cypress National Preserve. The Institute for Regional Conservation. Homestead, Florida. Available at: https://irma.nps.gov/DataStore/Reference/Profile/646691"&#13; + + + + + + Example Intercept Observations + Paired down, example species observation table from plants found on intercept points. + + Mini_BICY_Veg_Intercept_Cleaned.csv + 191995 + d2f8fe468e393c41c6dccf30bab1a91a + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + string + + + + + An identifier for the set of transects. + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + custom_TransectStartLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6988 + 26.2539 + + + + + + + custom_TransectStartLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3738 + -80.8414 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6966 + 26.2547 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3763 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 129 + 613 + + + + + + + custom_InterceptPoint + An identifier for the intercept point lying on the transect where the species occurrence was observed. + float + + + + dimensionless + + + natural + + 1 + 100 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3753211893717 + -80.841811227046 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the intercept point on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6982486534736 + 26.2548346243243 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Transect Observations + Paired down, example species observation table from plants found on transects. + + Mini_BICY_Veg_Transect_Cleaned.csv + 172831 + 1121726158224578eb5a1125f5c35624 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + scientificName + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + string + + + + + The full scientific name for the observed species according to the Guide to the Vascular Plants of Florida, Second Edition published by Richard P. Wunderlin and Bruce F. Hansen in 2003. University Press of Florida. + + + + + + + vernacularName + The common name in English. + string + + + + + The common name in English. + + + + + + + namePublishedIn + A reference for the publication in which the scientificName was originally established. + string + + + + + A reference for the publication in which the scientificName was originally established. + + + + + + + custom_TaxonAsRecorded + The species code used by the researchers who conducted the study. + string + + + + + The species code used by the researchers who conducted the study. + + + + + + + basisOfRecord + The specific nature of the data record. + string + + + + + The specific nature of the data record. + + + + + + + eventDate + The date during which the species occurrence was observed. + date + + + YYYY-MM-DD + + + + + locality + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + locationID + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + fieldNotes + Notes taken in the field about the study. + string + + + + + Notes taken in the field about the study. + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.353 + -80.8441 + + + + + + + custom_TransectEndLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.638 + 26.255 + + + + + + + custom_TransectEndLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the end of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3513 + -80.8422 + + + + + + + geodeticDatum + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which the geographic coordinates given in decimalLatitude and decimalLongitude as based. + + + + + + + coordinateUncertaintyInMeters + The horizontal distance (in meters) from the given decimalLatitude and decimalLongitude describing the smallest circle containing the whole of the Location. + float + + + + meter + + + natural + + 314 + 314 + + + + + + + locationRemarks + Comments or notes about the Location. + string + + + + + Comments or notes about the Location. + + + + + + + verbatimCoordinates + The verbatim original spatial coordinates of the transects in UTM's. + string + + + + + The verbatim original spatial coordinates of the transects in UTM's. + + + + + + + verbatimCoordinateSystem + The coordinate format for the verbatimCoordinates of the transects. + string + + + + + The coordinate format for the verbatimCoordinates of the transects. + + + + + + + verbatimSRS + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + string + + + + + The ellipsoid, geodetic datum, or spatial reference system (SRS) upon which coordinates given in verbatimCoordinates are based. + + + + + + + individualCount + The number of individuals present at the time of the Occurrence. + float + + + + dimensionless + + + natural + + 1 + 1 + + + + + + + custom_CoordinateBearing + The coordinate bearing of the transects in degrees. + float + + + + degree + + + whole + + 0 + 355 + + + + + + + custom_Transect + An identifier for the set of transects. + float + + + + dimensionless + + + natural + + 128 + 746 + + + + + + + taxonRank + The taxonomic rank of the most specific name in the scientificName. + string + + + + + The taxonomic rank of the most specific name in the scientificName. + + + + + + + coordinate_flag + A data quality flag indicating uncertainty regarding geographic coverage. + string + + + + + A data quality flag indicating uncertainty regarding geographic coverage. + + + + + + + taxonomic_flag + A data quality flag indicating uncertainty regarding taxonomic coverage. + string + + + + + A data quality flag indicating uncertainty regarding taxonomic coverage. + + + + + + + eventDate_flag + A data quality flag indicating uncertainty regarding temporal coverage. + string + + + + + A data quality flag indicating uncertainty regarding temporal coverage. + + + + + + + 500 + + + Example Geographic Coverage + Aggregated coordinates from the observation tables. Used for metadata coverage, NOT intended for analysis or mapping. + + Mini_BICY_Veg_Geography.csv + 31549 + 9c3c24a106e50fca2231b63c4dba12cf + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2295086 + + + + + + decimalLongitude + The geographic longitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + -81.3757451273932 + -80.8414 + + + + + + + decimalLatitude + The geographic latitude (in decimal degrees, using the spatial reference system WGS84) of the beginning of the transect on which the species occurrence was observed. + float + + + + degree + + + real + + 25.6363 + 26.2547 + + + + + + + parkID + The specific description of the place where the study occurred. + string + + + + + The specific description of the place where the study occurred. + + + + + + + 1000 + + + DRR: https://doi.org/10.36967/2294558 + DRR: Quantitative Plant Inventory of Big Cypress National Preserve + + NPS + + + 2294558 + + +
+ + + + NPS + TRUE + + + + + + + EMLassemblyline + 3.5.4 + + + + + + + EMLeditor + 0.0.1.1 + + + + + + PUBVER + + +
diff --git a/inst/extdata/BICY_veg/Mini_BICY_Veg_Geography.csv b/inst/extdata/BICY_veg/Mini_BICY_Veg_Geography.csv new file mode 100644 index 0000000..4f2785c --- /dev/null +++ b/inst/extdata/BICY_veg/Mini_BICY_Veg_Geography.csv @@ -0,0 +1,1001 @@ +decimalLongitude,decimalLatitude,parkID +-80.97776918830147,25.78989998667144,BICY +-81.02640878567064,25.869433786410116,BICY +-81.10148574559359,25.81876674132327,BICY +-81.15519939435676,26.01966196606359,BICY +-81.0341,26.24095795407766,BICY +-81.06637607888453,26.224199992422047,BICY +-81.34272778849552,26.0498725707323,BICY +-80.9316740344725,26.204244442916583,BICY +-80.90921910046579,25.825514505250354,BICY +-81.00229270442178,25.85563648097944,BICY +-81.03761376750028,25.77314428426216,BICY +-81.25729625713711,26.169601703324048,BICY +-81.03198690324248,25.820544287863715,BICY +-81.33518649599183,25.972046836345577,BICY +-80.91399956150791,26.18137601867971,BICY +-81.34325211965287,26.05001576723129,BICY +-80.96913254006661,25.706277629813822,BICY +-81.03587956860889,26.252952265654304,BICY +-81.02298576280829,25.825525392229217,BICY +-81.0428,25.760763716629725,BICY +-80.90971571421059,25.82589164086822,BICY +-81.1556739081313,26.018919354014972,BICY +-81.0189476420472,25.959099991728863,BICY +-81.0302,25.96324822311091,BICY +-81.34685626546391,25.86541610366107,BICY +-80.96720285734604,25.707143651844007,BICY +-81.082251139649415,25.814478981621118,BICY +-81.341173264778,26.045029538848816,BICY +-80.896952677597,26.01388447773325,BICY +-80.9083393178566,26.004826943310178,BICY +-81.35020612326586,25.951494451631547,BICY +-81.25506564444507,26.16758888397366,BICY +-81.21655687333919,26.19714444660695,BICY +-81.2369,26.179334424337203,BICY +-81.2530663130332,26.249097395898882,BICY +-81.01595435942323,25.838072085375583,BICY +-81.2265,26.2494389625475,BICY +-81.08509408745203,26.218049637164295,BICY +-81.17518266477126,25.881343254938653,BICY +-80.94181602446716,26.17906780247105,BICY +-80.88492380497705,25.80553553991766,BICY +-81.03155006060328,25.81975163219544,BICY +-81.10292307765535,25.86299999766673,BICY +-81.27821433664504,26.163976392654273,BICY +-81.06417960034935,26.205777915024452,BICY +-81.04623528945983,26.25264309240912,BICY +-81.04419779489125,25.707330477495013,BICY +-81.00633255128012,25.75624890422693,BICY +-81.0063218578107,26.17896792884389,BICY +-80.88617871122761,26.191788227147086,BICY +-81.2971,25.944414210253708,BICY +-81.04304877222211,25.815499999307264,BICY +-80.99308201086562,25.860360946756188,BICY +-81.09228309615268,26.180233335195503,BICY +-81.0498,26.216148214409028,BICY +-81.33418008831023,26.153199033274618,BICY +-81.3522655653241,25.8675836207437,BICY +-81.2265,26.248536368836863,BICY +-81.13718907399281,25.863675501945455,BICY +-81.09456030854723,26.215504853505628,BICY +-81.2265,26.251379538641306,BICY +-81.08557571613514,26.17899998503272,BICY +-81.27687487150511,26.17048373547479,BICY +-81.154486901717,26.02329133249349,BICY +-81.30595024073045,26.18984015593357,BICY +-80.9356645278652,25.74783870883999,BICY +-80.93681194743668,26.24861846007464,BICY +-81.15517347438731,26.024114101664427,BICY +-80.8441,25.92377525826558,BICY +-81.25088336994861,25.86360528571452,BICY +-81.05059968302581,26.241165965984084,BICY +-81.2548,26.24869123918479,BICY +-81.34384925910435,26.044890613646448,BICY +-80.8868,26.181516877463924,BICY +-80.93337485216344,26.203082906834013,BICY +-81.0821,25.816340692943694,BICY +-80.91651638013427,25.76419932842486,BICY +-80.93401731534485,25.801088893637264,BICY +-81.07617734503953,25.783937365862343,BICY +-81.2168261617484,26.198522222792864,BICY +-81.26516091887683,26.169399999494892,BICY +-81.2548,26.24866867434106,BICY +-81.343,26.18577434959173,BICY +-80.908645001946,25.827374561520745,BICY +-81.23827933462675,26.179044554366335,BICY +-80.9334300451251,26.002102614340075,BICY +-81.08517557808504,26.178999990247046,BICY +-81.2972497557416,25.946399999922583,BICY +-81.10013497910782,25.862686502430783,BICY +-80.9317,25.999958890870545,BICY +-80.89594431840243,26.01404514098799,BICY +-81.34231875677754,25.953777361958526,BICY +-80.90835536909725,26.00484422972947,BICY +-80.93900377215019,25.95374979943003,BICY +-81.09377197922451,26.216801640144634,BICY +-81.17557572995331,25.8812805550498,BICY +-81.08639726302091,26.219035929344443,BICY +-80.88160944394934,26.251863075469767,BICY +-81.09806927025775,26.233470427464347,BICY +-80.8523422475383,25.838452820939565,BICY +-81.02286939216309,25.82505022287882,BICY +-80.9107,25.98173585803894,BICY +-81.06692648118039,26.224199985717046,BICY +-81.25858741017328,25.874538023072468,BICY +-81.27747727080357,26.169318036197964,BICY +-81.02820571729477,25.930305704952588,BICY +-80.9575651925183,25.85409272238122,BICY +-81.24767556155587,26.07984119907523,BICY +-81.0390261448975,25.773168246753944,BICY +-80.97608594519266,25.790269703933053,BICY +-81.07660027501518,26.24997693933734,BICY +-81.049701454171,26.215915673413686,BICY +-80.84238177270349,25.77324325262261,BICY +-81.04710216737847,26.253094378950557,BICY +-81.07285019492382,26.16259999686498,BICY +-80.88773502835238,26.191022822878566,BICY +-81.2852351679285,26.126399845117952,BICY +-81.2265,26.25108619577704,BICY +-80.9208,25.725360185350493,BICY +-81.09228309615268,26.180233335195503,BICY +-80.89860960726624,25.97895670348656,BICY +-81.19592676262532,26.149662632249722,BICY +-81.2735794957252,25.907229202388272,BICY +-81.33347777625235,25.97689998587159,BICY +-81.0282914388929,26.042544144115176,BICY +-80.99489018200448,26.177736907319193,BICY +-81.17331804465172,25.880702168994365,BICY +-81.34191891921527,26.185644981805165,BICY +-80.87484123101981,25.979872349140365,BICY +-81.0320337614411,25.8205288511354,BICY +-81.33542510274988,25.977017254767308,BICY +-81.09387937496321,25.785167101017937,BICY +-81.04439211387226,25.816436486052194,BICY +-80.84191091778165,25.772598735539653,BICY +-81.04329348702353,25.707967441972723,BICY +-81.00505859548628,25.95428730707949,BICY +-81.0042684160642,25.842448304166435,BICY +-81.09680054881076,26.222631996039027,BICY +-81.02610098767184,25.9293666117024,BICY +-80.9230670463235,25.723599982366725,BICY +-80.91443722582734,26.180692054752456,BICY +-80.88163319386999,26.25049012077153,BICY +-81.09620554501743,26.22327157073157,BICY +-80.91822211707485,25.723799997681095,BICY +-81.2653,26.161667214010762,BICY +-80.90763570993514,26.006228879002087,BICY +-81.0302,25.964241115469424,BICY +-80.8868,26.182351784433216,BICY +-81.25608954692055,26.16940971319088,BICY +-81.25667177695426,25.898091947545417,BICY +-80.94821786965396,25.955799003220662,BICY +-81.27760409018195,26.16907262547866,BICY +-81.34622343801118,25.8652077180391,BICY +-81.27787828845217,26.16838888859329,BICY +-81.19430779493895,26.149534783450544,BICY +-81.19125578208714,26.21711242826671,BICY +-81.22594724698685,25.85539793257325,BICY +-80.93834098120453,25.95117134998437,BICY +-81.19635658374091,26.14992222337868,BICY +-81.04484386111034,25.815499982681626,BICY +-81.3341641890941,25.973988195475073,BICY +-81.05060622538305,26.241233402991792,BICY +-81.02655135891709,26.04159999059302,BICY +-81.02837390584338,26.252358750412395,BICY +-81.09064930824294,26.178099985391786,BICY +-81.3350048157936,26.138413056456866,BICY +-81.25107443460028,25.86346023280113,BICY +-80.99674038889376,25.850134326390666,BICY +-81.10220721360558,25.84311393376789,BICY +-81.07640523280219,26.249875399191065,BICY +-81.34324627115544,25.953386367402246,BICY +-81.33300342747214,25.97689997846608,BICY +-80.9144122165753,26.180731138443054,BICY +-81.07462386125593,26.250975115423405,BICY +-81.34444933164718,26.050409369382674,BICY +-81.264791825957,26.16751110503829,BICY +-81.08452535375356,26.178999996347805,BICY +-81.03243205563874,25.820397638333425,BICY +-81.1122417273034,25.833560110025378,BICY +-81.09570631050082,25.78576912746846,BICY +-81.00011342794521,25.85530582607666,BICY +-80.85469644771594,25.838299993288228,BICY +-81.01597432954247,25.92805553237365,BICY +-81.06570058515773,26.224199997770803,BICY +-81.18636266197247,26.154634056179297,BICY +-81.06620543147051,26.02468146163527,BICY +-81.02730074122746,26.04159999720123,BICY +-80.9224997182025,25.804799999965812,BICY +-81.2799,26.160443488293947,BICY +-81.02966575204721,26.248891597853458,BICY +-81.3345762681646,25.976899997052,BICY +-80.84309355630042,25.7731296066304,BICY +-80.84235952285887,25.771895184705812,BICY +-81.30508349269203,26.189915444646847,BICY +-80.9317,26.000410203305904,BICY +-81.23822628275319,26.17899668713911,BICY +-80.88795595081925,26.142190286189734,BICY +-81.3333279819007,25.976899983700978,BICY +-80.88584188194295,26.142467282181986,BICY +-81.0954720869651,25.785691945875076,BICY +-80.93407387078932,25.80023566735209,BICY +-81.00417468147933,25.84241743314565,BICY +-81.2499,26.25019123945812,BICY +-81.02691592107557,25.9307302037161,BICY +-81.00571903043934,25.75615094159223,BICY +-81.23225162671055,26.194421022371323,BICY +-81.18580966229574,26.154284595816822,BICY +-80.97791874690662,25.78989998456997,BICY +-81.09668249150165,25.986513908997782,BICY +-80.87700041725782,25.781634234001483,BICY +-81.07234790484092,25.85627612540441,BICY +-81.10174059938306,25.84303947454229,BICY +-80.8441,25.925106643880458,BICY +-80.94269243167463,26.252891993670055,BICY +-80.9248929550623,25.80479997862944,BICY +-80.91667773072305,26.179735095312136,BICY +-81.0443952003454,25.75975470084696,BICY +-81.0237331181736,25.8245988929803,BICY +-81.29279964623254,26.077268115343315,BICY +-80.94380142314266,26.25271567333336,BICY +-81.33471357146443,25.978131173028768,BICY +-80.9951125656037,26.177185596328794,BICY +-81.34255821078055,26.045315103430777,BICY +-80.93715456341776,25.74935714990406,BICY +-81.15510306614055,26.024137255833814,BICY +-80.9437498539752,26.25246549931409,BICY +-81.00278628046715,25.842562169469137,BICY +-81.3462,25.86513230187306,BICY +-81.09334883269285,26.216940552999823,BICY +-81.06667789927053,26.040050830843857,BICY +-80.9222891885051,25.805946498151666,BICY +-81.35117918810147,25.867199988580094,BICY +-81.2587933328786,25.89726350236039,BICY +-81.00697061402245,25.756350782623244,BICY +-81.19637395026427,26.1498333340296,BICY +-81.00746143225746,25.756429148716713,BICY +-81.09253932010668,26.17892222315785,BICY +-81.2729861611388,26.077024144872336,BICY +-81.33420178228539,25.976899994177224,BICY +-80.905,26.05257434542182,BICY +-81.17660752408113,25.88111596277297,BICY +-81.08214969688234,26.177547982902592,BICY +-81.06927569268153,26.007977117750453,BICY +-80.96895952596789,25.707166578123577,BICY +-81.00697408551223,26.179125607702527,BICY +-81.0302,25.96435394413792,BICY +-81.07653526090651,26.2499430926515,BICY +-81.04682043132013,26.252947711401507,BICY +-81.00719149513613,26.179178166664517,BICY +-80.88506753655217,26.141469125861192,BICY +-80.92229570688737,25.80587905709126,BICY +-81.24930485081788,26.250860429083218,BICY +-80.85357430222993,25.838299999741032,BICY +-81.23432463501656,26.187432064859603,BICY +-81.24867506052797,26.081599999945922,BICY +-81.0631,26.134589303459283,BICY +-81.2799,26.160736834855722,BICY +-81.07400628893713,25.7840296070307,BICY +-80.92696192672778,25.95196673299566,BICY +-81.235950741592,26.221258484939327,BICY +-81.03626693389633,26.23967174014857,BICY +-81.09438597819238,26.222454140181465,BICY +-80.94256921019371,26.252911584289826,BICY +-81.0821,25.814783625390426,BICY +-80.9222,26.018009737736033,BICY +-80.93548053417193,26.247851419686846,BICY +-80.85807411142665,25.736888532625127,BICY +-81.00152755571308,25.755835109222218,BICY +-80.88753307764526,26.142329210431363,BICY +-81.03034514177463,25.962639517345206,BICY +-81.0631,26.135356520272705,BICY +-81.27434152490387,25.906508538901825,BICY +-81.2369,26.17827386637435,BICY +-81.00578224450649,25.9549415245659,BICY +-80.92154737790891,25.723599998083575,BICY +-80.905,26.051400941501612,BICY +-81.2499,26.250462017520828,BICY +-81.34760628605996,25.86566307563291,BICY +-81.26503499172043,26.168755553312927,BICY +-80.93556523668217,25.74783084025071,BICY +-81.04643033640747,26.25274463233952,BICY +-81.2265,26.24919074928838,BICY +-81.24919225575981,26.250739428896278,BICY +-80.85165462886886,25.838562534641177,BICY +-80.87708470067163,25.784129379027178,BICY +-81.0388100478026,25.935649296901406,BICY +-81.02937488010164,26.25079541716967,BICY +-81.27373207642286,25.907165427014068,BICY +-81.17596879472025,25.88121785409562,BICY +-81.06559759955677,26.20470459374853,BICY +-80.92737818919693,25.951806181828,BICY +-81.27283236789684,25.9074102549576,BICY +-81.03890943244107,26.253136378326317,BICY +-81.26593301781763,25.91617073639281,BICY +-81.0774454618564,26.25041694356134,BICY +-81.34961707410586,25.952957590225814,BICY +-81.26526320500342,26.170251897478966,BICY +-80.95873025849055,25.855048871451753,BICY +-81.09452814827738,26.215470281830605,BICY +-81.28577394411825,26.097910066860045,BICY +-80.89526289406577,26.013736988644162,BICY +-80.9317,26.00081638447364,BICY +-81.01785892181624,25.959514865525012,BICY +-81.29287804637126,26.07645885292138,BICY +-81.19109811386045,26.21634719870573,BICY +-81.13737657489725,25.86361375581825,BICY +-81.06711930021719,26.041965808821153,BICY +-81.30170434336556,26.196877777806765,BICY +-80.90745133933889,26.042999990592442,BICY +-81.2548,26.24844302589984,BICY +-81.26526538449883,26.170274376700835,BICY +-80.93243526594708,26.001583613637003,BICY +-81.10328779615332,25.843286359900773,BICY +-81.302025747842265,26.195233334952928,BICY +-81.2282,25.868972151761373,BICY +-81.1885502047765,26.15509999269893,BICY +-81.24424232110377,26.14553871744409,BICY +-80.91304688537342,25.98229998096809,BICY +-81.06303505111671,26.133066152175893,BICY +-80.89418737946892,26.012578804180386,BICY +-81.066,26.204061525250722,BICY +-80.89045195320614,25.817533319685605,BICY +-81.22120975407312,25.846539306596654,BICY +-81.30177383699034,26.19652222268782,BICY +-81.34124368552189,26.045052692928792,BICY +-81.154398982152955,26.024368795637184,BICY +-80.86237349983195,25.764099999229916,BICY +-80.94717798798115,26.232533320983713,BICY +-81.33450517671429,26.081771564280366,BICY +-81.02963085728227,26.24925126151292,BICY +-81.02750057651025,26.04159999830692,BICY +-81.08134850921489,26.251099991621945,BICY +-80.99288783264768,25.849736980847233,BICY +-80.88752350284918,26.19109228230516,BICY +-81.28557009478729,26.097824239458664,BICY +-81.24358656425004,25.914646585265242,BICY +-80.8988174940237,25.83625535966986,BICY +-80.97789382047243,25.78989998493089,BICY +-81.0972186556913,26.222182563666752,BICY +-80.9208,25.72454779216464,BICY +-80.9086643626375,25.827309169883616,BICY +-81.03114940323665,25.820183802561555,BICY +-81.0375172889779,26.0429099031723,BICY +-81.09827473807886,26.232899999631957,BICY +-81.13582826294372,25.86484184571971,BICY +-81.25506564444507,26.16758888397366,BICY +-81.27723419884421,26.16978840640765,BICY +-81.00147194467498,25.855207733413422,BICY +-80.88508584680721,25.805281481308384,BICY +-81.06503555583791,26.039921011399233,BICY +-81.24234943831989,26.145688199819258,BICY +-81.26503933401311,26.168777775597857,BICY +-81.23550042737841,26.22196199238014,BICY +-80.91869545720883,25.723799994242142,BICY +-81.05523817226279,26.133565563020284,BICY +-81.08421387026439,25.718794161578234,BICY +-81.27353129399866,25.9072408833155,BICY +-81.0379,26.0424553388754,BICY +-81.08274985573046,26.25109999992154,BICY +-80.88572716327623,26.142319407442834,BICY +-80.90800886294704,26.00625838493369,BICY +-81.0631,26.13488265107406,BICY +-81.27757238538713,26.16913397816974,BICY +-80.92864568301975,26.250302254247465,BICY +-81.34240796734274,26.049821630118682,BICY +-81.0370715143949,26.253572808621335,BICY +-80.94268553530692,26.178782236773685,BICY +-81.25085764845235,26.00606723440128,BICY +-81.24227500450759,26.145582747933418,BICY +-80.8916495217111,26.253915404057718,BICY +-81.07528270815551,25.784233383273794,BICY +-81.02304213788915,25.824959957312036,BICY +-81.27491775919167,25.897509897347433,BICY +-81.10350882478768,25.843321627891672,BICY +-81.20146087651624,25.99549373316308,BICY +-81.29279964623254,26.077268115343315,BICY +-81.3350581207404,25.97190854514071,BICY +-81.09687178470885,25.78411929963287,BICY +-80.94328389420758,26.252797957223123,BICY +-81.0211786743017,25.982994545589648,BICY +-81.05907493586443,26.134899985061683,BICY +-81.08486176400993,26.22162196595814,BICY +-81.13681407159936,25.863798993471768,BICY +-81.08178655698063,25.99743116974226,BICY +-80.91257251492567,25.98229998788428,BICY +-80.8818918856454,26.251163344063432,BICY +-81.22339610756086,25.852866595632975,BICY +-81.2282,25.86867879335921,BICY +-81.00162571884594,25.75581943573756,BICY +-81.33490022808417,26.137334049018232,BICY +-81.09594824406422,26.22354814279126,BICY +-81.07275017440553,26.162599997490243,BICY +-80.88207694887718,25.789667038584504,BICY +-81.18695662825813,26.155009400110636,BICY +-81.09062429980689,26.178099985033317,BICY +-80.9233722524744,25.804799996749544,BICY +-80.9431853171849,26.252813630133485,BICY +-81.25522630758445,26.168411108705428,BICY +-81.23346463303209,26.193789195558068,BICY +-81.0022279073844,25.855602632656982,BICY +-81.2799,26.16134609306123,BICY +-81.2282,25.86962656661576,BICY +-81.2499,26.249807637185125,BICY +-81.25648357431177,26.169472404959272,BICY +-80.97402593842705,25.697739717882865,BICY +-81.37557056467845,25.842899989208888,BICY +-80.8441,25.923955785142944,BICY +-81.34130089625654,26.049645291754217,BICY +-81.0379,26.043087172561812,BICY +-81.05148854472448,26.24232538495612,BICY +-80.89416305392679,26.253779376081727,BICY +-81.22165074855151,25.90550380653316,BICY +-81.33485088556357,25.9779162066325,BICY +-81.10071798385974,25.998641527936094,BICY +-80.92852386634512,25.95240416409018,BICY +-81.05764997990939,26.134899998534138,BICY +-80.88601396048506,26.14268909411376,BICY +-80.92479323685983,25.804799980304892,BICY +-81.13812657656648,25.86336676888245,BICY +-80.8441,25.923797824125494,BICY +-81.02868671317738,26.251870209559836,BICY +-81.27967013897609,26.162874054719047,BICY +-81.34227144483813,26.185760749502112,BICY +-81.20115342850531,25.996257103720268,BICY +-80.95929459108015,25.85453826331083,BICY +-81.25091765887035,25.865081613918232,BICY +-81.0379,26.041981463574324,BICY +-81.27756564672654,26.166788883783507,BICY +-81.2552002539493,26.1682777749837,BICY +-81.03845688178664,25.77342214457861,BICY +-81.00444139364315,26.178137894087378,BICY +-81.13574348163144,25.865718572335915,BICY +-81.34053947932792,26.04482115058082,BICY +-81.3462,25.86506460374549,BICY +-81.02785628461855,25.868883893481513,BICY +-81.04302384043199,25.815499999382098,BICY +-81.2653,26.162141081447157,BICY +-81.0498,26.21678003286605,BICY +-81.19186684761958,26.217769282191693,BICY +-80.9767222780653,25.789899997076304,BICY +-81.37574512739322,25.84289998697617,BICY +-81.18715000706126,26.155099999991315,BICY +-81.23719509624881,26.189117374669358,BICY +-81.27215754080092,25.907573782997723,BICY +-81.08503199635854,25.720860435728586,BICY +-81.18511329701921,26.153844531575242,BICY +-81.2282,25.87061947179939,BICY +-81.33558767058773,25.972478995609883,BICY +-80.89591972424144,26.014049059516054,BICY +-80.91015502899263,25.826225259406883,BICY +-81.27771762427732,26.16756666402859,BICY +-81.0286011757578,25.971118264104657,BICY +-81.31190566176836,25.95855425587283,BICY +-80.9060495689903,26.230299998946077,BICY +-80.90853193305455,26.005034380221293,BICY +-81.17432283323829,25.881480407231454,BICY +-80.94647498467003,26.230769236384415,BICY +-81.37516057357885,25.842189161080313,BICY +-81.04424549814766,25.81549999068656,BICY +-81.35097964707151,25.867199985939944,BICY +-81.09369199800237,25.785105353415325,BICY +-80.94160036818475,26.177780306985593,BICY +-81.2201,25.845702644168398,BICY +-81.2837222439069,26.104277761221198,BICY +-81.02802035540013,25.868829866387237,BICY +-80.92225225086621,25.80632866414327,BICY +-81.08468663702888,26.22189554980252,BICY +-80.9595943907966,25.854267001829292,BICY +-80.94173130302734,26.253044797699676,BICY +-81.06584325817973,26.024528877664224,BICY +-80.93934700539269,25.95208087137192,BICY +-80.88647098426839,26.182491951794766,BICY +-81.09258709004023,26.1786777784638,BICY +-81.07245879531507,25.856551792904437,BICY +-81.15558649814787,26.019056151094066,BICY +-81.03734506963247,26.04277935926526,BICY +-80.93874004533293,25.954261086153114,BICY +-81.04708049534885,26.253083096851118,BICY +-80.91782351485675,25.7237999993846,BICY +-80.88608566006955,26.142781515689315,BICY +-81.09687360980328,26.232899989631605,BICY +-81.00634601436094,26.178973768854384,BICY +-81.25604586094902,25.873920648446415,BICY +-81.05544882347132,26.133725116414592,BICY +-81.3462,25.863755773155056,BICY +-81.35215195062256,25.867199997522718,BICY +-81.25199153843546,25.862763975276156,BICY +-81.05198138603662,26.242403748355084,BICY +-81.25091765887035,25.865081613918232,BICY +-81.32755401957344,25.892443409733445,BICY +-80.90869374237062,26.043366992241296,BICY +-81.03158324353065,25.725524160637622,BICY +-80.94685213553002,26.230866665053295,BICY +-81.05175960736435,26.24236848503484,BICY +-81.25043060607342,26.00712747218553,BICY +-81.04496852006089,25.81549998070391,BICY +-81.19109497650861,26.216939571529075,BICY +-81.3352410258059,25.973014864750823,BICY +-81.2499,26.250574841710616,BICY +-81.27512738271719,25.905661495098673,BICY +-81.0858,26.1979,BICY +-81.272,26.0767,BICY +-81.3355,25.9769,BICY +-80.8737,25.7601,BICY +-81.0252,26.0746,BICY +-80.9886,25.935,BICY +-81.2848,26.0975,BICY +-80.9468,26.2306,BICY +-81.2501,25.8642,BICY +-81.2674,26.2265,BICY +-81.2488,26.0816,BICY +-81.1021,25.863,BICY +-81.2349,26.2229,BICY +-81.2644,25.9152,BICY +-80.9177,25.7633,BICY +-80.9622,25.9273,BICY +-81.0622,26.2547,BICY +-81.0943,26.0296,BICY +-81.057,26.1349,BICY +-81.0449,26.2321,BICY +-81.343,26.1818,BICY +-81.1982,25.9812,BICY +-81.2548,26.25,BICY +-81.0892,26.21,BICY +-81.1641,26.1004,BICY +-80.9152,26.1795,BICY +-81.1655,26.045,BICY +-81.1057,26.2456,BICY +-81.0229,25.9843,BICY +-80.899,25.9782,BICY +-81.1551,26.0881,BICY +-81.0631,26.1331,BICY +-81.0927,26.1781,BICY +-81.0264,25.9309,BICY +-81.2779,26.1685,BICY +-81.0986,26.2329,BICY +-80.9758,25.7899,BICY +-80.905,26.0528,BICY +-80.9812,25.7817,BICY +-80.9093,25.9999,BICY +-81.1057,26.2456,BICY +-81.3423,26.0454,BICY +-81.0264,25.9309,BICY +-81.0764,25.7102,BICY +-80.9871,25.944,BICY +-81.0379,26.0432,BICY +-81.0622,26.2547,BICY +-80.9758,25.7899,BICY +-81.1057,26.2456,BICY +-81.0302,25.963,BICY +-81.1252,26.0397,BICY +-81.0753,26.2493,BICY +-81.0283,26.1624,BICY +-80.947,25.9569,BICY +-81.1627,26.1806,BICY +-81.1001,25.9992,BICY +-81.2319,25.9988,BICY +-81.1252,26.0397,BICY +-80.9303,25.7535,BICY +-81.0631,26.1331,BICY +-81.3054,26.1907,BICY +-80.9871,25.944,BICY +-81.22,25.9062,BICY +-80.947,25.9569,BICY +-81.2554,26.1693,BICY +-81.0845,26.2176,BICY +-80.9686,26.1307,BICY +-80.8861,26.1428,BICY +-81.0182,25.7474,BICY +-81.1158,25.9166,BICY +-81.0642,25.6901,BICY +-81.0341,26.2408,BICY +-81.2248,25.8536,BICY +-81.3357,25.9726,BICY +-80.9002,25.8358,BICY +-81.0147,26.2374,BICY +-81.098,26.079,BICY +-80.8533,25.8383,BICY +-80.9266,25.9514,BICY +-81.2025,25.9603,BICY +-81.0507,26.2422,BICY +-81.1119,26.0408,BICY +-80.9177,25.7633,BICY +-80.8461,25.8843,BICY +-80.9377,25.748,BICY +-80.926,26.2201,BICY +-80.9274,25.7538,BICY +-81.0341,26.2408,BICY +-81.293,26.0752,BICY +-81.0986,26.2329,BICY +-81.32,26.0974,BICY +-81.285,26.2346,BICY +-81.3348,26.1363,BICY +-81.0426,25.8155,BICY +-80.8571,25.6851,BICY +-80.9177,25.7633,BICY +-81.0271,26.065,BICY +-81.2554,26.1693,BICY +-81.045,26.252,BICY +-81.0174,25.9591,BICY +-81.0377,26.2539,BICY +-81.0764,25.7102,BICY +-81.343,26.1818,BICY +-81.0622,26.2547,BICY +-81.0608,26.0698,BICY +-81.2025,25.9603,BICY +-81.0653,26.0243,BICY +-81.154,26.0245,BICY +-81.2282,25.8708,BICY +-80.9377,25.748,BICY +-81.0341,26.2408,BICY +-81.2418,25.9154,BICY +-81.0986,26.2329,BICY +-80.9066,26.2303,BICY +-81.0005,25.8547,BICY +-81.1145,26.0211,BICY +-81.0048,26.1786,BICY +-81.1883,25.96,BICY +-81.2653,26.1609,BICY +-81.3357,25.9726,BICY +-81.003,25.7556,BICY +-81.1132,26.0167,BICY +-81.0379,26.0432,BICY +-81.1881,26.0039,BICY +-81.0846,25.7194,BICY +-81.2737,25.9072,BICY +-81.036,26.0663,BICY +-81.0772,25.8148,BICY +-80.9002,25.8358,BICY +-80.8875,26.1911,BICY +-81.0252,26.0746,BICY +-80.9002,25.8358,BICY +-81.0958,25.7858,BICY +-81.2848,26.0975,BICY +-81.2971,25.9464,BICY +-81.2737,25.9072,BICY +-81.098,26.079,BICY +-80.947,25.9569,BICY +-81.1132,26.0167,BICY +-80.8845,25.8062,BICY +-81.165,26.0603,BICY +-80.9439,26.2527,BICY +-81.0064,25.9555,BICY +-81.0252,26.0746,BICY +-81.343,26.1818,BICY +-80.934,25.801,BICY +-80.9622,25.9273,BICY +-81.1525,26.0673,BICY +-81.1422,25.8115,BICY +-81.1881,26.0039,BICY +-80.8461,25.8843,BICY +-81.0859,26.22,BICY +-81.2418,25.9154,BICY +-81.0653,26.0243,BICY +-81.0341,26.2408,BICY +-80.8461,25.8843,BICY +-81.0309,26.0617,BICY +-81.081,25.9962,BICY +-81.2319,25.9988,BICY +-81.2415,25.9059,BICY +-81.0986,26.2329,BICY +-81.2554,26.1693,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.9224,25.8048,BICY +-81.0283,26.1624,BICY +-81.0341,26.2408,BICY +-81.284,26.1057,BICY +-81.1676,25.7995,BICY +-81.1845,26.0927,BICY +-81.2352,26.1888,BICY +-81.1845,26.0927,BICY +-81.22,25.9062,BICY +-80.9107,25.9823,BICY +-81.0752,25.8993,BICY +-81.1145,26.0211,BICY +-81.3496,25.953,BICY +-81.2501,25.8642,BICY +-81.1038,25.8982,BICY +-81.1982,25.9812,BICY +-80.8861,26.1428,BICY +-81.1845,26.0927,BICY +-80.9886,25.935,BICY +-81.3355,25.9769,BICY +-80.9066,26.2303,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.3462,25.8652,BICY +-81.3052,26.2322,BICY +-81.0845,26.2176,BICY +-80.9177,25.7633,BICY +-81.0699,26.007,BICY +-81.2321,26.1945,BICY +-80.9525,26.2428,BICY +-81.0005,25.8547,BICY +-81.244,26.1814,BICY +-81.1762,26.047,BICY +-81.1021,25.863,BICY +-80.8861,26.1428,BICY +-81.0023,25.8418,BICY +-81.3116,26.2119,BICY +-80.9028,25.7563,BICY +-80.905,26.0528,BICY +-81.3394,26.0467,BICY +-81.2501,25.8642,BICY +-80.8747,25.98,BICY +-81.2501,25.8642,BICY +-80.9439,26.2527,BICY +-81.0631,26.1331,BICY +-81.036,26.0663,BICY +-80.8913,26.1527,BICY +-81.3429,26.0499,BICY +-81.1883,25.96,BICY +-81.0264,25.9309,BICY +-80.9093,25.9999,BICY +-80.9687,25.7085,BICY +-81.1525,26.0673,BICY +-81.289,26.2268,BICY +-81.0859,26.22,BICY +-81.0272,25.8691,BICY +-81.1123,26.0342,BICY +-81.1627,26.1806,BICY +-80.9317,26.0012,BICY +-81.0752,25.8993,BICY +-80.9446,26.1338,BICY +-81.2169,26.1989,BICY +-81.0449,26.2321,BICY +-81.067,25.8891,BICY +-81.1641,26.1004,BICY +-81.1132,26.0167,BICY +-81.0673,26.0401,BICY +-81.2554,26.1693,BICY +-81.1871,26.1551,BICY +-81.0295,26.2506,BICY +-80.9107,25.9823,BICY +-81.2282,25.8708,BICY +-81.0341,26.2408,BICY +-80.8861,26.1428,BICY +-81.2179,26.0014,BICY +-81.0368,25.9346,BICY +-81.3129,25.9578,BICY +-80.9374,26.2477,BICY +-80.9318,26.2036,BICY +-80.9274,25.7538,BICY +-81.1845,26.0927,BICY +-81.244,26.1814,BICY +-80.9307,25.7616,BICY +-81.2352,26.1888,BICY +-81.0846,25.7194,BICY +-81.0884,25.7272,BICY +-81.0048,26.1786,BICY +-81.0368,25.9346,BICY +-81.0498,26.2159,BICY +-81.0943,26.0296,BICY +-81.0302,25.963,BICY +-81.0341,26.2408,BICY +-81.2046,25.9562,BICY +-80.947,25.9569,BICY +-81.1605,26.0691,BICY +-81.2169,26.1989,BICY +-81.1905,26.2163,BICY +-81.1038,25.8982,BICY +-81.1905,26.2163,BICY +-81.0604,25.9163,BICY +-80.9318,26.2036,BICY +-81.0271,26.065,BICY +-81.1627,26.1806,BICY +-81.0653,26.0243,BICY +-81.1845,26.0927,BICY +-81.3056,26.2131,BICY +-80.9152,26.1795,BICY +-80.9397,25.9524,BICY +-80.8861,26.1428,BICY +-81.2169,26.1989,BICY +-81.0859,26.22,BICY +-81.1982,25.9812,BICY +-81.0368,25.9346,BICY +-81.0064,25.9555,BICY +-81.2499,26.2515,BICY +-81.0625,25.9,BICY +-80.9224,25.8048,BICY +-81.0147,26.2374,BICY +-81.2799,26.1627,BICY +-81.2369,26.1778,BICY +-81.0507,26.2422,BICY +-81.3056,26.2131,BICY +-81.1738,26.1729,BICY +-80.8861,26.1428,BICY +-81.1655,26.045,BICY +-81.0978,26.2061,BICY +-81.0943,26.0296,BICY +-81.1821,26.2207,BICY +-81.244,26.1814,BICY +-81.036,26.0663,BICY +-81.1422,25.8115,BICY +-80.9274,25.7538,BICY +-81.066,26.2044,BICY +-81.1907,25.9997,BICY +-81.1883,25.96,BICY +-81.3052,26.2322,BICY +-81.289,26.2268,BICY +-81.1038,25.8982,BICY +-81.2758,25.8842,BICY +-80.9266,25.9514,BICY +-80.8414,25.7734,BICY +-80.9303,25.7535,BICY +-81.1821,26.2207,BICY +-81.2349,26.2229,BICY +-80.899,25.9782,BICY +-81.1738,26.1729,BICY +-80.8619,25.7641,BICY +-81.0452,25.6888,BICY +-80.9758,25.7899,BICY +-81.2857,26.1255,BICY +-80.9812,25.7817,BICY +-80.9066,26.2303,BICY +-81.3348,26.1363,BICY +-81.1871,26.1551,BICY +-80.8861,26.1428,BICY +-81.066,26.2044,BICY +-80.9374,26.2477,BICY +-80.9405,26.1795,BICY +-81.1641,26.1004,BICY +-81.1158,25.9166,BICY +-81.0753,26.2493,BICY +-81.0625,25.9,BICY +-81.1123,26.0342,BICY +-80.9174,25.7238,BICY +-81.0295,26.2506,BICY +-81.0449,26.2321,BICY +-81.1305,25.9539,BICY +-80.8414,25.7734,BICY +-81.2017,25.9949,BICY +-81.3423,26.0454,BICY +-80.9224,25.8048,BICY +-81.0608,26.0698,BICY +-81.0631,26.1331,BICY +-81.0377,26.2539,BICY +-81.3738,25.8429,BICY +-81.1145,26.0211,BICY +-81.2758,25.8842,BICY +-81.1627,26.1806,BICY +-81.1655,26.045,BICY +-81.098,26.079,BICY +-80.9405,26.1795,BICY +-81.2418,25.9154,BICY +-81.2779,26.1685,BICY +-80.9812,25.7817,BICY +-81.1738,26.1729,BICY +-81.0295,26.2506,BICY +-81.285,26.2346,BICY +-81.1215,25.9827,BICY +-81.1907,25.9997,BICY +-81.2369,26.1778,BICY +-81.1132,26.0167,BICY +-81.3116,26.2119,BICY +-80.9871,25.944,BICY +-81.1012,25.8173,BICY +-81.1883,25.96,BICY +-81.1132,26.0167,BICY +-81.1881,26.0039,BICY +-81.0341,26.2408,BICY +-81.1215,25.9827,BICY +-81.1551,26.0881,BICY +-81.1305,25.9539,BICY +-80.899,25.9782,BICY +-81.1762,26.047,BICY +-81.0653,26.0243,BICY +-81.1551,26.0881,BICY +-80.9943,26.1792,BICY +-80.926,26.2201,BICY +-81.0449,26.2321,BICY +-81.3107,26.0769,BICY +-80.9303,25.7535,BICY +-80.9386,25.7091,BICY +-81.1123,26.0342,BICY +-81.0845,26.2176,BICY +-81.016,25.8376,BICY +-81.0943,26.0296,BICY +-81.036,26.0663,BICY +-81.0978,26.2061,BICY +-81.0452,25.6888,BICY +-81.3054,26.1907,BICY +-81.0829,26.2511,BICY +-81.0764,25.7102,BICY +-81.2674,26.2265,BICY +-80.8875,26.1911,BICY +-81.2219,25.8803,BICY +-80.9028,25.7563,BICY +-81.1012,25.8173,BICY +-81.098,26.079,BICY +-81.2441,26.2036,BICY +-81.1916,26.2526,BICY +-81.1738,26.1729,BICY +-81.129,25.9962,BICY +-81.0507,26.2422,BICY +-81.2422,26.1457,BICY +-81.0452,25.6888,BICY +-81.1057,26.2456,BICY +-81.0048,26.1786,BICY +-81.036,26.0663,BICY +-81.1574,25.9996,BICY +-81.0858,26.1979,BICY +-81.2321,26.1945,BICY +-81.2321,26.1945,BICY +-81.2025,25.9603,BICY +-81.0845,26.2176,BICY +-81.1676,25.7995,BICY +-80.8884,25.6363,BICY +-81.0958,25.7858,BICY +-80.9443,25.8396,BICY +-81.293,26.0752,BICY +-81.2971,25.9464,BICY +-81.2857,26.1255,BICY +-80.8868,26.1826,BICY +-81.343,26.1818,BICY +-81.1132,26.0167,BICY +-81.0884,25.7272,BICY +-81.1546,26.0206,BICY +-81.0835,26.179,BICY +-81.0927,26.1781,BICY +-81.0752,25.8993,BICY +-81.1881,26.0039,BICY +-81.0271,26.065,BICY +-80.9266,25.9514,BICY +-81.1905,26.2163,BICY +-81.0622,26.2547,BICY +-81.0302,25.963,BICY +-80.8414,25.7734,BICY +-80.9405,26.1795,BICY +-81.0161,25.9287,BICY +-81.272,26.0767,BICY +-80.8956,26.0141,BICY +-81.2758,25.8842,BICY +-81.2753,25.8978,BICY +-81.3129,25.9578,BICY +-81.0772,25.8148,BICY +-81.0283,26.1624,BICY +-81.0772,25.8148,BICY +-80.8746,25.749,BICY +-80.9377,25.748,BICY +-81.0668,26.0488,BICY +-81.081,25.9962,BICY +-80.8936,26.2529,BICY +-81.0341,26.2408,BICY +-81.0829,26.2511,BICY +-81.1845,26.0927,BICY +-81.0449,26.2321,BICY +-81.0147,26.2374,BICY +-81.1057,26.2456,BICY +-80.8837,25.7909,BICY +-80.9505,25.6812,BICY +-80.9152,26.1795,BICY +-81.2488,26.0816,BICY +-81.2653,26.1609,BICY +-81.0649,26.2242,BICY +-81.0943,26.0296,BICY +-81.0959,26.2236,BICY +-81.0719,26.1626,BICY +-80.8936,26.2529,BICY +-80.9871,25.944,BICY +-81.0283,26.1624,BICY +-81.2476,25.9646,BICY +-81.0295,25.971800000000002,BICY +-81.016,25.8376,BICY +-81.2779,26.1685,BICY +-80.9297,26.2511,BICY +-81.1769,25.8002,BICY +-81.1964,26.1497,BICY +-80.9297,26.2511,BICY +-81.0673,26.1841,BICY +-81.0282,26.0416,BICY +-81.3129,25.9578,BICY +-81.2753,25.8978,BICY +-81.1145,26.0211,BICY +-81.0859,26.22,BICY +-81.22,25.9062,BICY +-81.0222,25.8254,BICY +-81.2265,26.2498,BICY +-81.257,25.8982,BICY +-81.0283,26.1624,BICY +-81.0642,25.6901,BICY +-81.1215,25.9827,BICY +-81.0295,26.2506,BICY +-81.1145,26.0211,BICY +-80.9758,25.7899,BICY +-81.0147,26.2374,BICY +-81.0295,26.2506,BICY +-81.0379,26.0432,BICY +-81.0507,26.2422,BICY +-81.2906,26.1134,BICY +-81.1145,26.0211,BICY +-81.1845,26.0927,BICY +-81.1769,25.8002,BICY +-81.2418,25.9154,BICY +-81.0341,26.2408,BICY +-81.1605,26.0691,BICY +-81.32,26.0974,BICY +-81.1883,25.96,BICY +-81.0845,26.2176,BICY diff --git a/inst/extdata/BICY_veg/Mini_BICY_Veg_Intercept_Cleaned.csv b/inst/extdata/BICY_veg/Mini_BICY_Veg_Intercept_Cleaned.csv new file mode 100644 index 0000000..54c9029 --- /dev/null +++ b/inst/extdata/BICY_veg/Mini_BICY_Veg_Intercept_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,custom_TransectStartLatitude,custom_TransectStartLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,custom_InterceptPoint,decimalLongitude,decimalLatitude,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-07-12,BICY,158-63,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,63,-80.8619,25.76267831942774,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-28,BICY,226-53,NA,26.0181,-80.9222,26.0162,-80.9219,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,180,226,53,-80.9222,26.016904024911025,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-8,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,8,-80.9089001623441,26.042999999861784,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-52,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,52,-80.99985155431462,25.855716223773204,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-08-07,BICY,258-21,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,21,-81.26478287697877,26.160982285299287,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-15,BICY,338-71,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,71,-81.04653869596935,26.25280104329691,species,A,A,A +Capparis flexuosa,"Limber caper, Bayleaf capertree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cappflex,Human Observation,2004-03-25,BICY,375-38,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,38,-81.37462066537475,25.842471241550214,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151-82,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,82,-81.31274112594434,26.076738715948864,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-02,BICY,199-100,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,100,-80.99726024948605,25.850353666577362,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2002-11-15,BICY,286-13,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,13,-81.3462,25.864906641445376,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-15,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,15,-81.01634061740384,25.92895929639368,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2003-02-20,BICY,496-85,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,85,-80.93880333997689,25.95413837738667,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2004-04-29,BICY,418-38,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,38,-81.04354740802444,25.815499996912624,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,365-61,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,61,-81.09473094257677,26.22271522358408,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-03,BICY,381-88,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,88,-81.29953233759228,26.19724480041664,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-80,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,80,-80.90557064160309,26.199586516848427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,479-91,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,91,-81.0285340275839,25.93019764888485,species,A,A,A +Eupatorium capillifolium,Dog-fennel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupacapi,Human Observation,2004-05-06,BICY,340-22,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,22,-81.0512421243163,26.242286202622427,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-17,BICY,163-16,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,16,-81.0379,26.042838952191598,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-32,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,32,-81.37449108702471,25.842538940562743,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-11,BICY,492-89,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,89,-81.25489935389973,25.8747909487821,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-20,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,20,-80.88496852719378,25.80604563716998,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-01,BICY,403-78,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,78,-81.09236126678036,26.179833334986505,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-11,BICY,397-3,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,3,-80.9758747793026,25.78989999998078,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-69,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,69,-81.25049921430934,26.0092333710836,NA,A,R,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2003-11-26,BICY,476-69,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,69,-80.88536006986855,25.804851535538003,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-04-01,BICY,327-73,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,73,-81.08532562985383,26.178999988422035,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2004-05-05,BICY,328-87,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,87,-81.0341,26.24276314328995,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-05-28,BICY,208-13,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,13,-81.18228654349332,26.220940293302988,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-11-05,BICY,272-72,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,72,-81.22103041832507,25.907530910106082,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-05-22,BICY,213-2,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,2,-81.04284908298605,25.7595078372099,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-05,BICY,265-16,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,16,-81.15479979917771,26.02028732231089,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-17,BICY,379-12,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,12,-81.343,26.18572921950922,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,356-85,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,85,-81.00489974677217,25.95414369787102,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-01,BICY,254-62,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,62,-81.25692685563064,26.16954293190904,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-07-31,BICY,253-67,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,67,-81.34072726737581,26.044882895543335,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,415-52,NA,26.2242,-81.0649,26.2219,-81.0648,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,175,415,52,-81.06478661579294,26.223031089037942,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456-34,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,34,-81.34488677537823,25.953528482218267,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-08-07,BICY,258-3,NA,26.1609,-81.2653,26.1615,-81.263,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,80,258,3,-81.2652261253271,26.16091175515651,species,A,A,A +Laguncularia racemosa,White mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lagurace,Human Observation,2004-03-25,BICY,374-47,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,47,-81.37497206394212,25.84289999527126,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-06-05,BICY,264-19,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,19,-81.15443770368351,26.02019711081848,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-17,BICY,197-39,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,39,-80.96886869253706,25.707633275860616,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-06,BICY,435-47,NA,25.8173,-81.1012,25.8194,-81.102,WGS84,314,"Cell #AC50, endpoint corrected using arcmap","17N 2855456 E, 489854 N",UTM,WGS84,1,350,435,47,-81.10140348477688,25.81834449769692,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-20,BICY,496-51,NA,25.9524,-80.9397,25.9546,-80.9388,WGS84,314,Cell #AT35,"17N 2870419 E, 506034 N",UTM,WGS84,1,25,496,51,-80.93916200714683,25.953443027148317,NA,A,R,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-04-09,BICY,442-84,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,84,-81.09640096253148,25.789547237394085,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-08,BICY,348-68,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,68,-80.99965203033479,25.8560289073999,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-07-31,BICY,195-97,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,97,-81.34051364772196,26.049519890418832,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-06-01,BICY,317-54,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,54,-81.03545745969187,25.934706197811966,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-04-09,BICY,180-93,NA,26.1888,-81.2352,26.1866,-81.2357,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,150,180,93,-81.23403701955594,26.18698259923732,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2004-04-29,BICY,404-34,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,34,-81.03084490169276,25.820512251283947,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-07,BICY,493-73,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,73,-81.02891102275343,25.86853657320384,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-11,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,11,-81.06286185427768,26.13297589116773,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-13,BICY,477-12,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,12,-81.01604799826556,25.928433323760995,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,360-79,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,79,-80.92758594646658,25.9529438566219,species,A,A,A +Hydrilla verticillata,Water-thyme,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrvert1,Human Observation,2004-05-07,BICY,297-17,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,17,-80.91782351485675,25.7237999993846,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,159-96,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,96,-81.28697439621374,26.098415489026312,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-83,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,83,-81.0631,26.1349729118762,species,A,A,A +Agalinis fasciculata,Beach false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agalfasc,Human Observation,2002-08-23,BICY,246-86,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,86,-81.2258724254734,25.855280676390954,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-22,BICY,244-28,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,28,-81.24243321524328,25.91513296945733,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,255-91,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,91,-81.25500485357458,26.16727777184175,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-15,BICY,339-68,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,68,-81.04332420751605,26.25173354295214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-20,BICY,400-47,NA,26.2504,-80.8822,26.2525,-80.8815,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,20,400,47,-80.88179773878937,26.251396587934817,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-29,BICY,404-97,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,97,-81.03185455825667,25.819423181961362,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,368-56,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,56,-80.9208,25.724863722858792,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-08-22,BICY,244-86,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,86,-81.24374486631633,25.91457982593195,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-90,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,90,-80.8868,26.180569145111114,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-13,BICY,478-91,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,91,-81.01755976176914,25.93027305850519,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,362-50,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,50,-80.9107,25.981171716033902,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-07-18,BICY,166-34,NA,25.9962,-81.081,25.9979,-81.0825,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,330,166,34,-81.08142448903241,25.9968644413706,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-18,BICY,146-78,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,78,-81.3334497379113,26.154299986796023,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-08,BICY,256-97,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,97,-80.8868,26.180411189706845,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-08,BICY,441-52,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,52,-81.23555046255855,26.22188382495977,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-11-15,BICY,286-42,"""?"" was Spartina sp.",25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,42,-81.3462,25.86425222616542,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,138-85,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,85,-81.02607675012057,26.041599984397287,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-06,BICY,341-55,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,55,-81.05058005599938,26.24096365495537,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-07-31,BICY,252-61,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,61,-81.34373189145916,26.044929204104672,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-12,BICY,161-3,NA,25.8383,-80.8533,25.8383,-80.8557,WGS84,314,"Cell #BB48, SE of Dade-Collier Airport","17N 2857785 E, 514705 N",UTM,WGS84,1,270,161,3,-80.85337480969908,25.838299999980737,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2002-08-09,BICY,260-6,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,6,-81.00494493842739,26.178635041536346,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-93,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,93,-81.2950124425862,26.076249276410472,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-07-11,BICY,160-65,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,65,-81.2848,26.09896674550112,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-21,BICY,238-82,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,82,-80.89698389524663,25.977878669686778,species,A,A,A +Physostegia purpurea,"False dragonhead, Eastern false dragonhead",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physpurp,Human Observation,2003-04-24,BICY,612-53,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,53,-81.08393984508324,25.718364211079404,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-26,BICY,412-17,NA,26.1626,-81.0719,26.1649,-81.0717,WGS84,314,Cell #AF12,"17N 2893694 E, 492816 N",UTM,WGS84,1,5,412,17,-81.07186295108838,26.162982147180138,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-19,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,19,-80.87660014039014,25.78241141162989,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,185-75,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,75,-80.84233460049337,25.771934270901305,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-27,BICY,230-67,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,67,-80.9074263596319,26.042999990305205,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-10-29,BICY,279-58,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,58,-81.29047365260891,26.112096194610395,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-12,BICY,139-94,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,94,-81.02840465097998,26.043713084197073,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,351-8,NA,25.8614,-80.9935,25.8595,-80.9926,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,160,351,8,-80.99343175637678,25.861230358746425,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-10-31,BICY,276-83,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,83,-81.25505411496277,25.89755939242957,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-08,BICY,175-87,NA,25.9,-81.0625,25.9007,-81.0648,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,290,175,87,-81.06453971613082,25.900671451970386,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-05-13,BICY,611-69,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,69,-81.24391853886421,26.145564288561236,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-28,BICY,229-93,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,93,-80.89410711803183,26.012492372175736,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2002-08-29,BICY,250-36,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,36,-81.07481632370458,25.784158927868585,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-06-16,BICY,335-81,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,81,-81.09657336802998,26.232899985711605,species,A,A,A +Psidium guajava,Guava,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psidguaj,Human Observation,2002-07-31,BICY,195-81,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,81,-81.34090727177983,26.04958259162316,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-16,BICY,335-90,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,90,-81.09634818670001,26.232899982360006,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-4,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,4,-81.06245010099188,25.899921829302702,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-08,BICY,256-86,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,86,-80.8868,26.18065940534057,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-18,BICY,225-2,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,2,-81.0432956580165,25.707944961315253,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-05-04,BICY,343-17,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,17,-81.10168243219292,25.862933383993163,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-11-08,BICY,271-95,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,95,-81.00773138256133,25.756472249362513,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-28,BICY,227-89,NA,26.0181,-80.9222,26.0166,-80.9231,WGS84,314,Cell #AU28,"17N 2877690 E, 507785 N",UTM,WGS84,1,235,227,89,-80.92402073167305,26.016948054603084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-06,BICY,423-97,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,97,-80.91584819975306,25.764707009526962,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,191-3,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,3,-80.87643160123346,25.78286135603138,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2002-11-15,BICY,287-58,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,58,-81.34755940968135,25.86564763999845,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,238-79,NA,25.9782,-80.899,25.9776,-80.8962,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,100,238,79,-80.8970576549835,25.97789042616909,species,A,A,A +Coccoloba diversifolia,"Pigeonplum, Tietongue",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coccdive,Human Observation,2004-05-07,BICY,297-35,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,35,-80.9182719423521,25.723799997391502,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-02,BICY,357-19,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,19,-81.00681072303922,25.955285624683707,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-04-01,BICY,326-22,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,22,-81.08314634594909,26.178619711060527,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,372-36,NA,25.8451,-81.3595,25.8456,-81.362,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,290,372,36,-81.36034362766395,25.845377847789507,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-21,BICY,215-83,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,83,-80.9045233739181,26.230299984999007,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-09,BICY,263-46,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,46,-80.99518126167017,26.17986720620945,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,145-37,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,37,-81.1119557617947,25.833378904101462,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-89,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,89,-81.2550135379649,26.167322216434414,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-01-03,BICY,461-83,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,83,-80.90564454045791,26.199574760704827,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,419-9,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,9,-81.04279432423813,25.81560154775418,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-68,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,68,-80.90527504603541,26.199633541043,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-20,BICY,188-1,NA,25.7909,-80.8837,25.7887,-80.8841,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,195,188,1,-80.88370645148883,25.79087820265396,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-07-10,BICY,151-16,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,16,-81.31109826891615,26.076868532208188,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-86,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,86,-81.3595,25.843159314738212,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-18,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,18,-81.04935654356153,26.215970529829455,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277-57,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,57,-81.25823156899776,25.897556865464892,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-22,BICY,313-9,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,9,-81.2799,26.162496913975417,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2002-05-21,BICY,215-71,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,71,-80.90482360901423,26.230299989023074,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,436-13,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,13,-81.2499,26.25120665714066,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,251-34,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,34,-81.07634918854308,25.783806817184978,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,364-89,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,89,-81.09733122237934,26.222061562430884,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-04-24,BICY,613-87,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,87,-81.08516095254025,25.721296386387458,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-07,BICY,368-63,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,63,-80.9208,25.72502168820073,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-05,BICY,467-58,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,58,-80.94186302516144,26.17905236662199,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,489-27,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,27,-81.29358425382918,26.0755046315416,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,387-8,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,8,-81.03752662430894,26.25380974058547,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-10-29,BICY,291-7,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,7,-81.28578749019016,26.125363205534835,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-44,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,44,-81.09426564890799,26.216639573569655,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-09-17,BICY,222-26,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,26,-80.97382148892368,25.69824865347358,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,361-64,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,64,-80.92798345115361,25.95212209812084,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-07-17,BICY,163-92,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,92,-81.0379,26.04112397485525,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-03,BICY,380-23,NA,26.1969,-81.3017,26.1947,-81.3022,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,190,380,23,-81.30179989699081,26.19638888950503,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-27,BICY,231-9,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,9,-80.9089410299245,26.043143605797923,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-16,BICY,334-73,NA,26.2329,-81.0986,26.2346,-81.0971,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,40,334,73,-81.09742595453511,26.234161852005624,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-31,BICY,321-54,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,54,-81.0631,26.134318521035034,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-04-29,BICY,606-81,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,81,-81.25164762575665,25.86302507253479,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-07,BICY,493-17,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,17,-81.02759845880314,25.868968792825573,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2004-03-25,BICY,373-11,NA,25.8451,-81.3595,25.8474,-81.3595,WGS84,314,Cell #C47,"17N 2858583 E, 463972 N",UTM,WGS84,1,180,373,11,-81.3595,25.844851772844272,species,A,A,A +Citrus sinensis,Sweet orange,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,citrsine,Human Observation,2002-08-01,BICY,193-29,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,29,-81.26507407241391,26.168955553870116,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-04-29,BICY,419-60,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,60,-81.04389550118088,25.81617698009412,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2002-05-09,BICY,183-96,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,96,-80.8441,25.923233677606486,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-04-08,BICY,170-11,NA,25.9578,-81.3129,25.959,-81.315,WGS84,314,Cell #2460/H34,"17N 2871044 E, 468672 N",UTM,WGS84,1,310,170,11,-81.31311033972267,25.95795955470294,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-10-31,BICY,274-45,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,45,-81.26531980767803,25.91578244379672,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-11,BICY,482-40,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,40,-81.0302,25.963902629453415,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-05-18,BICY,366-72,NA,26.2061,-81.0978,26.2076,-81.0996,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,310,366,72,-81.09917968742167,26.207144316435482,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,310-78,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,78,-81.27756130454043,26.166766661487195,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-03-17,BICY,377-85,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,85,-81.34193712297355,26.180138933559565,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-18,BICY,147-38,NA,26.1543,-81.3354,26.1527,-81.334,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,135,147,38,-81.3347281617439,26.15369367179814,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-09-19,BICY,221-30,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,30,-80.88820508412788,26.190868467481533,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-07,BICY,259-40,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,40,-81.2653,26.161802604710058,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-11-08,BICY,288-42,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,42,-80.93734205864097,25.748890629883487,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-15,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,15,-80.89327492264032,26.253069235858746,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-21,BICY,500-87,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,87,-80.9317,25.99923679091539,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-62,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,62,-81.06645113374306,26.224199991631814,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-05,BICY,331-59,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,59,-81.02876178654817,26.25175295964892,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-06-18,BICY,148-100,NA,26.1363,-81.3348,26.137,-81.3325,WGS84,314,"Cell #F15, SE of Miles City","17N 2890819 E, 466533 N",UTM,WGS84,1,70,148,100,-81.33245079760394,26.137071755974638,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389-76,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,76,-80.88788547202643,26.142213440316382,species,A,A,A +Piloblephis rigida,Wild pennyroyal,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pilorigi,Human Observation,2003-01-04,BICY,460-78,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,78,-80.93146119301555,26.205333328842006,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-01-03,BICY,458-11,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,11,-80.94656165551669,26.23072410675415,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-05,BICY,330-94,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,94,-81.02970500840094,26.248486976204912,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-03-24,BICY,370-25,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,25,-81.33518792714445,25.977388561262217,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,432-28,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,28,-81.2548,26.249368184463812,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-29,BICY,607-90,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,90,-81.25154293560504,25.865755786087636,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,405-91,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,91,-81.03243205563874,25.820397638333425,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,263-58,NA,26.1792,-80.9943,26.1805,-80.9961,WGS84,314,Cell #AN10,"17N 2895533 E, 500573 N",UTM,WGS84,1,310,263,58,-80.99541115766941,26.180041259105646,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,197-38,NA,25.7085,-80.9687,25.7065,-80.9691,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,190,197,38,-80.9688643671179,25.70765549956022,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,190-51,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,51,-80.87693721599395,25.781756946337328,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-06-13,BICY,136-90,NA,26.0401,-81.0673,26.0421,-81.0672,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,5,136,90,-81.06710406021493,26.04212316615924,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,unknown,Human Observation,2002-11-08,BICY,271-15,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,15,-81.00576811206956,25.75615877869819,NA,A,R,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-11-08,BICY,270-17,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,17,-81.00258280804076,25.75566661579219,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222-23,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,23,-80.97379593261353,25.698312270399768,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-09,BICY,442-48,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,48,-81.0958862681343,25.79021270833703,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-04-09,BICY,181-5,NA,26.1888,-81.2352,26.1889,-81.2377,WGS84,314,Cell #3893; P09,"17N 2896616 E, 476496 N",UTM,WGS84,1,280,181,5,-81.23532315377633,26.188819591830427,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-71,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,71,-81.09704176471091,26.222372708283775,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,219-5,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,5,-81.03924733536763,25.773597739803417,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,393-57,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,57,-80.8923647010215,26.253543092328314,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2004-03-30,BICY,391-82,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,82,-80.89094397271622,26.154522230357323,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-17,BICY,376-99,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,99,-81.34459146317975,26.180088693436154,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2004-04-07,BICY,436-74,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,74,-81.2499,26.24983020202528,species,A,A,A +Ardisia escallonioides,Marlberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ardiesca,Human Observation,2002-07-31,BICY,194-51,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,51,-81.34409720964224,26.050293605076394,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-11-05,BICY,293-97,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,97,-81.24637617424298,26.081599979645024,NA,A,R,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-05,BICY,466-10,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,10,-80.91507495611722,26.179695419102433,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-07-31,BICY,252-8,NA,26.0454,-81.3423,26.045,-81.3444,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,250,252,8,-81.34248778969547,26.04533825708644,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-06,BICY,454-60,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,60,-81.35089698765815,25.952323021093076,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-32,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,32,-81.11113045505716,25.833619368638836,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-02-11,BICY,492-29,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,29,-81.25604586094902,25.873920648446415,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-29,BICY,404-14,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,14,-81.0305243719368,25.820857986075968,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,250-35,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,35,-81.07484087024012,25.784162846611416,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-49,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,49,-81.03108529778808,25.82025294971525,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,310-39,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,39,-81.27773065101835,26.16763333089536,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2003-05-13,BICY,610-51,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,51,-81.24283753353728,26.144703356128495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,319-44,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,44,-81.0561573817379,26.134261793727916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-05,BICY,466-42,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,42,-80.91467481288956,26.180320759464532,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-21,BICY,239-81,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,81,-80.8981453499425,25.979856565618284,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-13,BICY,430-59,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,59,-81.27464624661282,25.906180093862798,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-22,BICY,244-98,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,98,-81.24401624087237,25.91446538095698,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2004-05-26,BICY,359-98,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,98,-81.02460640382857,25.825784000277075,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-66,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,66,-80.905,26.051310679653696,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-05-07,BICY,369-58,NA,25.7236,-80.9208,25.7235,-80.9229,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,270,369,58,-80.92224493062385,25.72359999283682,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-11-08,BICY,289-97,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,97,-80.93529218599629,25.747809201281104,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-22,BICY,313-68,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,68,-81.2799,26.161165572116825,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,250-17,NA,25.784300000000002,-81.0757,25.7839,-81.0732,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,100,250,17,-81.07528270815551,25.784233383273794,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-13,BICY,479-65,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,65,-81.02792430799886,25.930398323845903,species,A,A,A +Centrosema virginianum,Spurred butterfly-pea,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centvirg,Human Observation,2004-06-03,BICY,352-95,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,95,-81.06630276113883,26.02624287265822,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-29,BICY,207-47,NA,26.1989,-81.2169,26.2003,-81.2148,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,60,207,47,-81.21588189138772,26.199430273877997,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-06-10,BICY,315-100,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,100,-81.18505185327507,26.153805702214523,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-05-05,BICY,331-55,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,55,-81.0288118353783,26.25167479301879,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-11-26,BICY,474-40,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,40,-80.90894186354473,25.82637188940324,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-20,BICY,401-63,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,63,-80.88064744199556,26.250646847218793,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-23,BICY,237-68,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,68,-81.22094789906245,25.84612890921281,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-22,BICY,312-94,NA,26.1627,-81.2799,26.164,-81.278,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,50,312,94,-81.27809940371633,26.164063418699314,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,130-43,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,43,-81.2229079653584,25.880631871563516,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-07,BICY,169-47,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,47,-81.0889,25.835160608448742,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-05-22,BICY,219-71,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,71,-81.03855217068093,25.772247903287706,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-13,BICY,480-65,NA,25.9309,-81.0264,25.9289,-81.0261,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,170,480,65,-81.02611832150852,25.929455503803325,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-05-20,BICY,191-8,NA,25.7828,-80.8764,25.7848,-80.8776,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,335,191,8,-80.87648427002814,25.782963616067267,species,A,A,A +Acrostichum danaeifolium,Giant leather fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acrodana,Human Observation,2003-06-04,BICY,520-96,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,96,-81.3506055076404,25.867199980250348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-06-16,BICY,335-9,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,9,-81.09837481866998,26.2328999998236,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-01,BICY,316-27,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,27,-81.03738355859672,25.934904637472652,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-26,BICY,414-53,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,53,-81.06622596916748,26.22419999388495,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-05-13,BICY,610-79,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,79,-81.2431875473455,26.144156177842707,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-04,BICY,345-52,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,52,-80.89169647812676,25.817799994218067,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-04-28,BICY,409-6,NA,25.8148,-81.0772,25.8145,-81.0796,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,220,409,6,-81.07729615442571,25.814696279700353,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-04-02,BICY,427-26,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,26,-80.9370746954694,26.248208084608585,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-31,BICY,195-8,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,8,-81.34270318685857,26.049868652248716,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2004-03-30,BICY,388-78,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,78,-80.8849814989884,26.1413582193379,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,235-97,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,97,-80.905,26.050611150294113,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-09,BICY,261-81,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,81,-81.00363812566675,26.177102773493385,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,320-44,NA,26.1331,-81.0631,26.1321,-81.0609,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,120,320,44,-81.06214742013123,26.132603562296886,species,A,A,A +Eleocharis cellulosa,Gulf Coast spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleocell,Human Observation,2002-08-27,BICY,235-34,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,34,-80.905,26.052032774405415,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-24,BICY,370-70,NA,25.9769,-81.3355,25.9789,-81.3346,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,30,370,70,-81.33462618950502,25.97826796975523,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-44,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,44,-81.2548,26.24900714698961,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,387-46,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,46,-81.03670309343592,26.253381005493313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-29,BICY,405-41,NA,25.8211,-81.0303,25.8202,-81.0326,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,250,405,41,-81.0312605996102,25.820783555216646,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-08,BICY,256-87,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,87,-80.8868,26.180636840283313,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-24,BICY,613-35,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,35,-81.08482566842335,25.72016291438282,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-09-19,BICY,221-77,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,77,-80.88930971032325,26.190505726241064,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-30,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,30,-81.0307807958905,25.82058139830022,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,416-93,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,93,-81.09311375085214,26.21701772626903,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-14,BICY,416-87,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,87,-81.09325479999379,26.216971422353733,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-88,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,88,-81.3510991005026,25.86819289306896,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-08,BICY,350-37,NA,25.8614,-80.9935,25.8614,-80.996,WGS84,314,Cell #AN45,"17N 2860338 E, 500653 N",UTM,WGS84,1,250,350,37,-80.9943671765429,25.861114429738386,NA,A,R,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-13,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,13,-80.90877526380915,26.042999999635015,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-59,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,59,-81.09684879207634,26.222580138521103,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,490-39,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,39,-81.29291506828429,26.076076701175776,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-08-27,BICY,231-79,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,79,-80.90770458278303,26.044260533712613,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,271-37,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,37,-81.00630801042716,25.756244985771204,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-24,BICY,322-31,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,31,-81.07503468204506,26.249957324199677,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,526-8,NA,25.7363,-80.8579,25.7376,-80.8559,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,60,526,8,-80.85772738199728,25.736390265666138,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-64,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,64,-81.25047753185183,26.009122257268697,NA,A,R,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-10,BICY,153-96,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,96,-81.33378345195776,26.079966634546782,species,A,A,A +Hymenocallis palmeri,Alligatorlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hymepalm,Human Observation,2002-07-10,BICY,151-99,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,99,-81.31316428550107,26.076705275398496,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-17,BICY,186-5,NA,26.0077,-81.2502,26.0099,-81.2509,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,350,186,5,-81.25022168193516,26.007811113878372,NA,A,R,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-20,BICY,189-20,NA,25.7909,-80.8837,25.7895,-80.8818,WGS84,314,Cell #AY53,"17N 2852536 E, 511658 N",UTM,WGS84,1,130,189,20,-80.88331810259795,25.790609893079694,NA,A,R,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-05-22,BICY,218-59,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,59,-81.03791822498403,25.773244623274426,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-11-26,BICY,474-60,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,60,-80.90881279389896,25.82680783389367,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-09-17,BICY,222-15,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,15,-80.97372778232034,25.698481915511667,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,221-22,NA,26.1911,-80.8875,26.1901,-80.8896,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,250,221,22,-80.88801706196637,26.190930209825016,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-01-03,BICY,461-73,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,73,-80.90539821088413,26.199613947702446,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,185-33,NA,25.7734,-80.8414,25.7713,-80.8427,WGS84,314,"Cell #BC55, Point B29S","17N 2850603 E, 515906 N",UTM,WGS84,1,210,185,33,-80.84181122704604,25.77275507997237,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2003-01-04,BICY,460-17,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,17,-80.93172615830727,26.203977776902523,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2002-08-08,BICY,256-60,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,60,-80.8868,26.18124609680443,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-22,BICY,313-72,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,72,-81.2799,26.161075311642925,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-35,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,35,-80.99414039845246,25.849537147076916,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-05,BICY,465-32,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,32,-80.91598812231439,26.179625386055463,species,A,A,A +Ocotea coriacea,Lancewood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ocotcori,Human Observation,2003-11-26,BICY,475-56,NA,25.8062,-80.8845,25.8065,-80.8823,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,250,475,56,-80.88581187308297,25.805767780263164,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-22,BICY,245-69,NA,25.9154,-81.2418,25.9176,-81.2417,WGS84,314,Cell #O39,"17N 2866336 E, 475780 N",UTM,WGS84,1,0,245,69,-81.2418,25.916957045968793,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-06-04,BICY,525-45,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,45,-80.87562031128574,25.980582438576665,species,A,A,A +Aristida beyrichiana,Southern wiregrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arisbeyr,Human Observation,2004-04-07,BICY,436-97,NA,26.2515,-81.2499,26.2493,-81.2496,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,180,436,97,-81.2499,26.24931121068379,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477-55,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,55,-81.01586166063933,25.927477733670713,species,A,A,A +Scleria,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,scleria sp.,Human Observation,2004-05-12,BICY,360-47,Scleria species,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,47,-80.92718657264685,25.952318497826056,genus,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-27,BICY,235-20,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,20,-80.905,26.05234869083658,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-29,BICY,248-9,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,9,-81.09591216493145,25.78562411314039,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,239-100,NA,25.9782,-80.899,25.9802,-80.8984,WGS84,314,Cell #AX32,"17N 2873270 E, 510111 N",UTM,WGS84,1,25,239,100,-80.89794487300416,25.98024514195285,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-05,BICY,468-19,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,19,-80.94073758222824,26.179128703391463,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2003-04-29,BICY,607-95,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,95,-81.25162309980213,25.86584221821773,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,234-17,NA,26.0528,-80.905,26.0519,-80.9029,WGS84,314,Cell #AW24,"17N 2881537 E, 509501 N",UTM,WGS84,1,120,234,17,-80.90463220798472,26.05260819314068,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-22,BICY,218-20,NA,25.7737,-81.0393,25.7737,-81.0393,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,110,218,20,-81.03883160050776,25.77354563648134,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2002-10-31,BICY,277-94,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,94,-81.25903100137657,25.897139386542218,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-66,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,66,-81.32824727851953,25.893590603053205,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-06-04,BICY,521-52,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,52,-81.35187674504624,25.867786712565994,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-02,BICY,355-72,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,72,-81.06900099418787,26.008407048664903,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-17,BICY,163-32,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,32,-81.0379,26.042477904365153,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-11-26,BICY,476-8,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,8,-80.88459971924343,25.806043656567812,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-06-12,BICY,138-23,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,23,-81.02762547356198,26.041599998857603,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-21,BICY,452-56,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,56,-80.90890111407545,26.005431966900517,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-05-06,BICY,340-46,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,46,-81.05183353357357,26.242380239512975,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-11,BICY,154-58,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,58,-81.28544959485284,26.10569999271476,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-7,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,7,-81.082251139649415,25.814478981621118,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2002-08-01,BICY,255-27,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,27,-81.25528275733059,26.168699998411185,species,A,A,A +Panicum repens,Torpedo grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirepe,Human Observation,2004-05-20,BICY,392-99,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,99,-80.89483872983098,26.25483462432435,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-05-05,BICY,330-79,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,79,-81.02967229479172,26.24882416091436,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-12,BICY,361-97,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,97,-80.92869679975038,25.952494424772134,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-06-01,BICY,316-92,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,92,-81.03878843419596,25.93563801428814,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2004-06-22,BICY,311-59,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,59,-81.27727647236857,26.16970660292461,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-17,BICY,223-13,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,13,-80.97384804300451,25.69898857133994,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,606-24,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,24,-81.25055855897027,25.86385187508352,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-05-13,BICY,428-36,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,36,-81.27461196789078,25.897277814491705,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-02,BICY,198-70,NA,25.8494,-80.995,25.8499,-80.9928,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,80,198,70,-80.99328079492201,25.84967428906325,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-31,BICY,203-52,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,52,-81.0650035760271,26.20515423005808,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-02,BICY,357-34,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,34,-81.00713497701912,25.955116380185586,species,A,A,A +Woodwardia virginica,Virginia chain fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,woodvirg,Human Observation,2002-06-05,BICY,266-79,NA,26.0245,-81.154,26.0245,-81.154,WGS84,314,Cell #X27,"17N 2878407 E, 484596 N",UTM,WGS84,1,200,266,79,-81.15467482602739,26.022824828752604,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2004-06-02,BICY,354-43,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,43,-81.06884251523772,26.006831501688968,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-04-29,BICY,607-50,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,50,-81.25090162622686,25.865064327416114,species,A,A,A +Rhynchospora miliacea,Millet beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmili,Human Observation,2003-04-24,BICY,613-67,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,67,-81.08503199635854,25.720860435728586,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,196-4,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,4,-80.96862954546704,25.708436172201857,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2004-04-14,BICY,416-63,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,63,-81.09381899544377,26.216786205305908,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-05-23,BICY,528-67,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,67,-80.93414556800218,25.799493814963455,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523-44,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,44,-80.84525861139564,25.962138216630755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,133-52,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,52,-81.13578695938376,25.865268968962408,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-24,BICY,613-28,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,28,-81.08478053450835,25.720010331540596,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2002-08-29,BICY,248-46,NA,25.7858,-81.0958,25.7836,-81.0971,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,210,248,46,-81.09637328395115,25.78490102176433,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-08-07,BICY,259-17,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,17,-81.2653,26.1612836070156,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-06-10,BICY,314-89,NA,26.1551,-81.1871,26.1553,-81.1895,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,270,314,89,-81.18932531422588,26.15509998280862,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-03-30,BICY,391-13,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,13,-80.89124355738787,26.152988890268055,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,374-61,NA,25.8429,-81.3738,25.8427,-81.3759,WGS84,314,Cell #B47,"17N 2858345 E, 462537 N",UTM,WGS84,1,270,374,61,-81.37532118937166,25.84289999203457,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-08,BICY,348-54,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,54,-80.99982661387453,25.855755309242273,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-06-17,BICY,142-97,NA,25.8434,-81.104,25.8432,-81.1015,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,100,142,97,-81.10161780626372,25.84301987975998,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2002-07-31,BICY,253-53,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,53,-81.341055896933,26.044990948639054,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-21,BICY,240-25,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,25,-80.90868521885282,25.999997960674026,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,158-82,NA,25.7641,-80.8619,25.7619,-80.8615,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,180,158,82,-80.8619,25.762249558565728,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-03-03,BICY,384-64,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,64,-81.30620034748266,26.18944931699202,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-23,BICY,530-65,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,65,-80.92225876929028,25.80626122308807,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-05-27,BICY,527-91,NA,25.7363,-80.8579,25.7383,-80.8588,WGS84,314,Cell #BB59,"17N 2846491 E, 514249 N",UTM,WGS84,1,345,527,91,-80.85848682684382,25.73828357190053,NA,A,R,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-05-21,BICY,216-44,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,44,-80.92960403566165,26.252089074584948,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2004-04-01,BICY,402-55,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,55,-81.09132453601654,26.17809999342804,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-08-01,BICY,254-49,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,49,-81.25660670795796,26.169491995915624,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-07-18,BICY,165-37,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,37,-81.08190984572684,25.99605501333051,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-20,BICY,401-93,NA,26.2504,-80.8822,26.2511,-80.8799,WGS84,314,Cell #AY02,"17N 2903418 E, 511768 N",UTM,WGS84,1,80,401,93,-80.87990812635387,26.250764387613103,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-10-29,BICY,279-57,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,57,-81.29047583098846,26.112118674016592,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-09-19,BICY,220-10,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,10,-80.88728339634741,26.191212824958466,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-32,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,32,-80.89941417017701,25.835674603698543,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-26,BICY,358-84,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,84,-81.0240138277168,25.824452209651966,NA,A,R,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-09,BICY,442-3,NA,25.7911,-81.0952,25.7893,-81.0965,WGS84,314,Cell #AD53,"17N 2852556 E, 490453 N",UTM,WGS84,1,215,442,3,-81.09524289205767,25.791044544369086,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-14,BICY,417-69,NA,26.2163,-81.0953,26.2149,-81.0936,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,140,417,69,-81.0941904665914,26.21510727879857,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-31,BICY,194-42,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,42,-81.34388593677134,26.05022414607968,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-06-05,BICY,265-34,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,34,-81.15502457198703,26.019935559564363,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-07,BICY,432-50,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,50,-81.2548,26.248871757932104,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-06-17,BICY,144-77,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,77,-81.11103265605861,25.834630980610356,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-12,BICY,485-70,NA,25.971800000000002,-81.0295,25.9706,-81.0277,WGS84,314,Cell #AK33,"17N 2872562 E, 497044 N",UTM,WGS84,1,130,485,70,-81.02816132937303,25.97078464660914,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-12,BICY,488-15,NA,25.9843,-81.0229,25.9831,-81.0247,WGS84,314,Cell #AK32,"17N 2873950 E, 497711 N",UTM,WGS84,1,240,488,15,-81.02322433412235,25.98413075709959,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-06-03,BICY,353-75,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,75,-81.06699768880996,26.025015235896745,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-04-01,BICY,327-80,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,80,-81.08550069025074,26.178999986095143,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-02,BICY,395-43,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,43,-80.94284029739715,26.25286848478675,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-29,BICY,404-10,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,10,-81.03046026576222,25.820927132947574,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-09,BICY,184-65,NA,25.7734,-80.8414,25.7729,-80.8438,WGS84,314,"Cell #BC55, Point B29W","17N 2850603 E, 515906 N",UTM,WGS84,1,260,184,65,-80.84299537933317,25.77314528214674,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2002-06-04,BICY,200-91,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,91,-81.09483233643263,25.986326724451057,species,A,A,A +Bursera simaruba,Gumbo-limbo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,burssima,Human Observation,2003-11-26,BICY,476-98,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,98,-80.88572154269822,25.804284788011685,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-04-15,BICY,386-44,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,44,-81.0386019511163,26.253330520402816,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-11,BICY,482-87,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,87,-81.0302,25.964963218917358,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-11-05,BICY,272-74,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,74,-81.22105904138644,25.907567879723235,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-01-03,BICY,461-60,NA,26.1999,-80.9036,26.1995,-80.9062,WGS84,314,Cell #AW08,"17N 2897822 E, 509630 N",UTM,WGS84,1,260,461,60,-80.9050779821917,26.19966489016844,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-07-10,BICY,153-37,NA,26.0821,-81.3342,26.0798,-81.3337,WGS84,314,"Cell #F21, W of Prairie Fire Trail","17N 2884819 E, 466581 N",UTM,WGS84,1,170,153,37,-81.33403945365347,26.081277765615344,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-86,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,86,-81.08395687244807,25.815370334677088,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2004-04-29,BICY,404-51,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,51,-81.03111735052168,25.820218376142016,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-14,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,14,-81.26405596933301,25.91514514024024,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-24,BICY,371-37,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,37,-81.3345762681646,25.976899997052,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-04,BICY,471-13,NA,25.8376,-81.016,25.8394,-81.0174,WGS84,314,Cell #AL48,"17N 2857701 E, 498394 N",UTM,WGS84,1,330,471,13,-81.01616208707374,25.8378540568264,NA,A,R,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2002-11-08,BICY,271-7,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,7,-81.00557178558736,25.75612743017503,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-07,BICY,439-9,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,9,-81.2265,26.250003083559058,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-28,BICY,406-49,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,49,-81.08315798175585,25.81495286802978,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,345-4,NA,25.8178,-80.8904,25.8179,-80.8928,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,270,345,4,-80.89049972908667,25.817799999965786,NA,A,R,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-11,BICY,160-12,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,12,-81.2848,26.09777078380727,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2002-10-31,BICY,275-45,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,45,-81.26329418827487,25.915023662150993,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-02-13,BICY,477-49,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,49,-81.01588766105792,25.927611071844794,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2002-05-29,BICY,205-39,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,39,-81.29807341232043,25.9463999967291,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-05-31,BICY,129-22,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,22,-81.0492579976137,26.215986202939067,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,155-65,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,65,-81.28371790402126,26.104255538733803,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-04-28,BICY,406-92,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,92,-81.08408642281783,25.81543803155527,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-42,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,42,-80.86294668383901,25.764099996237032,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-28,BICY,229-65,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,65,-80.8945565835934,26.01297639081458,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-03-30,BICY,391-38,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,38,-80.8911350131217,26.153544448381115,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-07,BICY,439-49,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,49,-81.2265,26.250905677085388,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-29,BICY,251-67,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,67,-81.07697927817061,25.783328136944732,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-21,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,21,-81.2369,26.17827386637435,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-16,BICY,335-8,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,8,-81.09839983881777,26.232899999860624,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2002-08-01,BICY,255-88,NA,26.1693,-81.2554,26.1675,-81.2543,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,170,255,88,-81.25501788016253,26.16734443873045,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-02-21,BICY,498-11,NA,26.0064,-80.9098,26.0064,-80.9073,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,95,498,11,-80.90952635378332,26.006378365800863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,404-71,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,71,-81.0314378768338,25.81987264001187,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-10-31,BICY,275-26,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,26,-81.26376108615759,25.91509811693887,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-28,BICY,208-26,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,26,-81.18247308775311,26.2211805863559,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-26,BICY,414-82,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,82,-81.06695149946655,26.224199985362212,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2004-06-24,BICY,323-9,NA,26.2493,-81.0753,26.2505,-81.0773,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,300,323,9,-81.07549504029157,26.249401541654922,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-29,BICY,419-69,NA,25.8155,-81.0426,25.8165,-81.0447,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,300,419,69,-81.04408982762844,25.81627852610696,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-07-10,BICY,150-10,NA,26.0769,-81.3107,26.0753,-81.3127,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,230,150,10,-81.31089141049704,26.076754952391212,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-05-08,BICY,174-19,NA,25.9,-81.0625,25.8982,-81.0612,WGS84,314,Cell #AG41,"17N 2864610 E, 493737 N",UTM,WGS84,1,150,174,19,-81.06226298029705,25.899628689027427,NA,A,R,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2004-04-01,BICY,327-71,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,71,-81.08527561259757,26.178999989047753,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,294-9,NA,26.0816,-81.2488,26.0798,-81.2476,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,150,294,9,-81.24868755464323,26.08142412032108,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2002-08-27,BICY,235-12,NA,26.0528,-80.905,26.0506,-80.905,WGS84,314,"Cell #AW24, endpoint estimated using arcmap","17N 2881537 E, 509501 N",UTM,WGS84,1,180,235,12,-80.905,26.052529214505338,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-06-17,BICY,145-51,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,51,-81.1122417273034,25.833560110025378,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-05-31,BICY,203-93,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,93,-81.0642179249942,26.20574890652723,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,483-91,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,91,-81.01967153913365,25.959099982181773,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-30,BICY,389-28,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,28,-80.88675780755968,26.14258390164379,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-08-02,BICY,199-55,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,55,-80.99624313273061,25.8499245209863,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-04-15,BICY,387-10,NA,26.2539,-81.0377,26.2532,-81.0356,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,120,387,10,-81.03748328042805,26.253787175698967,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-05-21,BICY,215-21,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,21,-80.90607458858165,26.230299999039712,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,230-77,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,77,-80.90717656256207,26.042999987195273,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-17,BICY,143-24,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,24,-81.10389607146693,25.842866641222123,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2002-09-19,BICY,220-88,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,88,-80.88559387353435,26.192092848382913,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-11,BICY,492-4,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,4,-81.2565235672608,25.8735580206026,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-04,BICY,344-14,NA,25.8178,-80.8904,25.8156,-80.8909,WGS84,314,Cell #AX50,"17N 2855514 E, 510987 N",UTM,WGS84,1,190,344,14,-80.8904606120512,25.817488872963782,NA,A,R,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-15,BICY,338-12,NA,26.252,-81.045,26.2528,-81.0473,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,300,338,12,-81.0452600598085,26.25213538876314,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-23,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,23,-81.10100387122024,25.817787721364656,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2004-04-01,BICY,402-84,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,84,-81.09059929137084,26.178099984670503,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-05,BICY,466-88,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,88,-80.91409959951712,26.18121968419084,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-06-17,BICY,337-81,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,81,-81.2369,26.179627770129127,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2002-08-01,BICY,192-94,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,94,-81.26540487394408,26.17171304668553,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-71,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,71,-81.26489169698513,26.168022217798246,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-04-01,BICY,403-89,NA,26.1781,-81.0927,26.1803,-81.0924,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,10,403,89,-81.09231349590463,26.180077779566354,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-23,BICY,236-70,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,70,-81.2201,25.846379627221072,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,233-83,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,83,-81.03254308164351,25.725840596751752,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-07-17,BICY,164-57,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,57,-81.03680927855248,26.04237322133755,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-17,BICY,144-88,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,88,-81.11100874938381,25.834878263505285,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-07-11,BICY,154-83,NA,26.1057,-81.284,26.1051,-81.2863,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,270,154,83,-81.28607442022034,26.10569998508085,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-7,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,7,-81.0960125694166,26.223478999820507,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-05-28,BICY,208-57,NA,26.2207,-81.1821,26.2226,-81.1838,WGS84,314,Cell #U05,"17N 2900139 E, 481814 N",UTM,WGS84,1,325,208,57,-81.1829179271581,26.2217535918575,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-06-04,BICY,525-16,NA,25.98,-80.8747,25.981,-80.8767,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,305,525,16,-80.87502722075153,25.98020708994763,NA,A,R,A +Conocarpus erectus,Buttonwood,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conoerec,Human Observation,2003-06-04,BICY,520-58,NA,25.8672,-81.353,25.8671,-81.3506,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,90,520,58,-81.35155332753263,25.867199992791033,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-29,BICY,251-54,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,54,-81.07673106164845,25.783516708277972,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-10-31,BICY,275-35,NA,25.9152,-81.2644,25.9145,-81.262,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,100,275,35,-81.26353992392951,25.915062849069,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-08-27,BICY,230-90,NA,26.043,-80.9091,26.0433,-80.9065,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,90,230,90,-80.90685182637131,26.042999982506608,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-06-22,BICY,310-74,NA,26.1685,-81.2779,26.1671,-81.2762,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,170,310,74,-81.27757867329474,26.166855550671237,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2003-02-06,BICY,453-55,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,55,-81.35006953345321,25.95183373038586,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-18,BICY,165-63,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,63,-81.08254919544203,25.995953127380485,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-06,BICY,454-38,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,38,-81.3504214272395,25.952571248048354,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-12-20,BICY,464-53,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,53,-81.30178458741196,26.06849141568431,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-03-11,BICY,396-54,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,54,-80.97657205609023,25.79089819928609,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-05-13,BICY,610-64,NA,26.1457,-81.2422,26.1436,-81.2431,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,210,610,64,-81.24300004035413,26.14444930917816,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-20,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,20,-80.84371766834109,25.92569010052842,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-01-03,BICY,458-46,NA,26.2306,-80.9468,26.2319,-80.9444,WGS84,314,Cell #AS04,"17N 2901222 E, 505314 N",UTM,WGS84,1,60,458,46,-80.94580328333967,26.231118989237313,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-05-18,BICY,364-69,NA,26.2236,-81.0959,26.222,-81.0973,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,220,364,69,-81.09700960265269,26.222407280008397,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-05-05,BICY,331-43,NA,26.2506,-81.0295,26.2527,-81.0285,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,30,331,43,-81.0289619814668,26.25144029301866,NA,A,R,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-31,BICY,321-63,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,63,-81.0631,26.134521607854175,species,A,A,A +Rhizophora mangle,Red mangrove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhizmang,Human Observation,2004-03-25,BICY,375-64,NA,25.8429,-81.3738,25.8434,-81.3763,WGS84,314,"Cell #B47,endpoint estimated using arcmap","17N 2858345 E, 462537 N",UTM,WGS84,1,240,375,64,-81.37518216985374,25.842177877819555,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2002-08-01,BICY,192-56,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,56,-81.26532205167302,26.170858836433094,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-08-28,BICY,228-58,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,58,-80.89702645986932,26.013872721609076,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353-18,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,18,-81.06570744343719,26.024471658440273,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-02-06,BICY,454-79,NA,25.953,-81.3496,25.9516,-81.3514,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,240,454,79,-81.35130769732359,25.952108642004475,species,A,A,A +Amphicarpum muhlenbergianum,Blue-maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,amphmuhl,Human Observation,2004-04-02,BICY,395-79,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,79,-80.94195310216915,26.253009535802367,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-02-05,BICY,467-61,NA,26.1795,-80.9405,26.1786,-80.9427,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,250,467,61,-80.94193352617964,26.17902921281956,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-05-31,BICY,203-14,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,14,-81.06573173327054,26.204603062625544,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-23,BICY,530-98,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,98,-80.92218706621945,25.807003074644793,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,144-2,NA,25.8329,-81.1112,25.8352,-81.1114,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,5,144,2,-81.1111956534657,25.83294496054299,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-06-04,BICY,524-100,NA,25.98,-80.8747,25.9783,-80.8761,WGS84,314,Cell #AZ32,"17N 2873479 E, 512543 N",UTM,WGS84,1,225,524,100,-80.87646536582642,25.9784043541861,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-04-28,BICY,406-83,NA,25.8144,-81.0821,25.8152,-81.0841,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,300,406,83,-81.08389209731841,25.81533648619446,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-09-19,BICY,220-68,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,68,-80.88602708693261,26.19186720325253,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2002-07-17,BICY,164-96,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,96,-81.0360630042715,26.04180752587444,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-08-21,BICY,240-93,NA,25.9999,-80.9093,26.0006,-80.907,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,80,240,93,-80.9070130089734,26.00026440047971,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-05-09,BICY,183-75,NA,25.9254,-80.8441,25.9234,-80.8439,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,180,183,75,-80.8441,25.923707560685404,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-70,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,70,-81.2282,25.869220378092397,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-06-17,BICY,333-40,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,40,-81.17518266477126,25.881343254938653,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2002-11-15,BICY,286-15,NA,25.8652,-81.3462,25.8636,-81.3461,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,180,286,15,-81.3462,25.864861509359002,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2002-08-28,BICY,229-69,NA,26.0141,-80.8956,26.0125,-80.894,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,140,229,69,-80.8944923740018,26.012907245382276,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-24,BICY,612-32,NA,25.7194,-81.0846,25.7177,-81.0832,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,150,612,32,-81.08420141453159,25.718774618385467,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2002-05-22,BICY,219-28,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,28,-81.0390050792215,25.773127342635146,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-11-26,BICY,476-20,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,20,-80.88474929761783,25.80580914128499,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-08-08,BICY,257-88,NA,26.1826,-80.8868,26.1821,-80.8845,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,110,257,88,-80.8847319111967,26.181920827330956,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459-12,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,12,-80.9320820640969,26.203507387568916,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2004-05-12,BICY,363-81,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,81,-80.9127223161197,25.98229998586822,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-08-01,BICY,193-56,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,56,-81.26495683073348,26.168355552150047,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2004-03-24,BICY,371-6,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,6,-81.33535020564831,25.976899999922473,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-02-11,BICY,491-26,NA,25.8735,-81.2566,25.8745,-81.2587,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,300,491,26,-81.2571616558755,25.873793357120466,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-06,BICY,453-54,NA,25.953,-81.3496,25.9508,-81.3501,WGS84,314,Cell #D35,"17N 2870527 E, 464999 N",UTM,WGS84,1,200,453,54,-81.35006099656393,25.9518549353032,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-07-12,BICY,157-65,NA,25.7641,-80.8619,25.7635,-80.8642,WGS84,314,"Cell #BA56, Lysiloma Hammock","17N 2849565 E, 513849 N",UTM,WGS84,1,270,157,65,-80.86351986784605,25.764099990987226,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-09-18,BICY,225-74,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,74,-81.04313934443759,25.709563568393484,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2002-04-24,BICY,177-64,NA,25.8539,-80.96,25.8543,-80.9575,WGS84,314,Cell #AR46/1812,"17N 2859501 E, 504007 N",UTM,WGS84,1,85,177,64,-80.9584099225389,25.854025864139842,NA,A,R,A +Tripsacum dactyloides,"Eastern gamagrass, Fakahatchee grass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tripdact,Human Observation,2003-11-26,BICY,476-32,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,32,-80.88489887540338,25.805574625840734,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-05-12,BICY,362-21,NA,25.9823,-80.9107,25.98,-80.9103,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,180,362,21,-80.9107,25.981826120755663,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2003-02-21,BICY,452-20,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,20,-80.90947896762079,26.00605427454934,NA,A,R,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-04-08,BICY,440-35,NA,26.2229,-81.2349,26.2233,-81.2373,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,290,440,35,-81.23572282521577,26.223170115697435,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,280-15,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,15,-81.2282,25.87046150962017,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-05-09,BICY,182-99,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,99,-80.84220743998783,25.926835987641123,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,315-4,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,4,-81.18701807326325,26.155048228652266,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-01,BICY,402-3,NA,26.1781,-81.0927,26.1782,-81.0902,WGS84,314,Cell #AD10,"17N 2895406 E, 490734 N",UTM,WGS84,1,90,402,3,-81.0926249746918,26.17809999998045,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2003-02-11,BICY,489-99,NA,26.0752,-81.293,26.0762,-81.2954,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,300,489,99,-81.29514227882372,26.076316970693977,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2004-04-06,BICY,423-32,NA,25.7633,-80.9177,25.765,-80.9164,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,50,423,32,-80.91708910165129,25.763764170725214,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-06-02,BICY,357-55,NA,25.9555,-81.0064,25.9541,-81.0084,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,240,357,55,-81.00758893103298,25.954879436661777,NA,A,R,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-03-31,BICY,318-48,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,48,-81.05819996290961,26.134899995003934,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,NA,Human Observation,2004-04-07,BICY,437-61,NA,26.2515,-81.2499,26.25,-81.2482,WGS84,314,Cell #O02,"17N 2903558 E, 475040 N",UTM,WGS84,1,140,437,61,-81.24891881158993,26.250445570923535,NA,A,R,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2004-04-06,BICY,434-56,NA,25.8173,-81.1012,25.8187,-81.1007,WGS84,314,Cell #AC50,"17N 2855456 E, 489854 N",UTM,WGS84,1,20,434,56,-81.10072246625163,25.81848749497714,species,A,A,A +Taxodium distichum,Bald cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxodist,Human Observation,2003-04-24,BICY,613-82,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,82,-81.08512871340668,25.721187398735886,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-01-04,BICY,459-60,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,60,-80.93321031602116,26.203136932301497,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-30,BICY,389-99,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,99,-80.88842580872736,26.14203592446244,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2004-03-31,BICY,318-40,NA,26.1349,-81.057,26.1348,-81.0596,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,270,318,40,-81.05799996909136,26.13489999653051,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-07-17,BICY,164-28,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,28,-81.03736420509647,26.042793864154078,species,A,A,A +Sesuvium portulacastrum,"Perennial sea-purslane, Shoreline seapurslane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sesuport,Human Observation,2003-03-25,BICY,445-75,NA,25.8941,-81.3267,25.8932,-81.3289,WGS84,314,Cell #G42,"17N 2863995 E, 467279 N",UTM,WGS84,1,250,445,75,-81.32845827001574,25.893521138551627,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-06-20,BICY,141-77,NA,25.8358,-80.9002,25.8353,-80.8977,WGS84,314,Cell #AX48; south of dade-collier airport,"17N 2857500 E, 510001 N",UTM,WGS84,1,100,141,77,-80.89830909979094,25.83549825795452,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-05-18,BICY,365-41,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,41,-81.09511423814358,26.223005315271724,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,433-25,NA,26.25,-81.2548,26.2492,-81.2524,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,120,433,25,-81.2542582199449,26.24971793847805,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-05-07,BICY,297-54,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,54,-80.91874528248609,25.723799993790713,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2002-06-20,BICY,133-56,NA,25.8641,-81.1359,25.8662,-81.1356,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,5,133,56,-81.13577826385962,25.86535888964038,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-01,BICY,254-48,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,48,-81.25658208122542,26.169488077732787,species,A,A,A diff --git a/inst/extdata/BICY_veg/Mini_BICY_Veg_Transect_Cleaned.csv b/inst/extdata/BICY_veg/Mini_BICY_Veg_Transect_Cleaned.csv new file mode 100644 index 0000000..756a8e2 --- /dev/null +++ b/inst/extdata/BICY_veg/Mini_BICY_Veg_Transect_Cleaned.csv @@ -0,0 +1,501 @@ +scientificName,vernacularName,namePublishedIn,custom_TaxonAsRecorded,basisOfRecord,eventDate,locality,locationID,fieldNotes,decimalLatitude,decimalLongitude,custom_TransectEndLatitude,custom_TransectEndLongitude,geodeticDatum,coordinateUncertaintyInMeters,locationRemarks,verbatimCoordinates,verbatimCoordinateSystem,verbatimSRS,individualCount,custom_CoordinateBearing,custom_Transect,taxonRank,coordinate_flag,taxonomic_flag,eventDate_flag +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-04-24,BICY,178,NA,25.8574,-81.0728,25.8554,-81.0716,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,160,178,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2004-03-03,BICY,381,NA,26.1969,-81.3017,26.1979,-81.3003,WGS84,314,Cell #I08,"17N 2897525 E, 469858 N",UTM,WGS84,1,80,381,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-02-20,BICY,494,NA,25.9569,-80.947,25.9552,-80.9487,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,225,494,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-07-11,BICY,160,NA,26.0975,-81.2848,26.0998,-81.2851,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,0,160,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-01,BICY,704,NA,25.6851,-80.8571,25.6848,-80.8596,WGS84,314,Cell #BB65,"17N 2840821 E, 514337 N",UTM,WGS84,1,260,704,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-07-31,BICY,194,NA,26.0499,-81.3429,26.0503,-81.3446,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,290,194,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2002-05-17,BICY,187,NA,26.0077,-81.2502,26.0055,-81.2512,WGS84,314,Cell #N29/185,"17N 2876558 E, 474962 N",UTM,WGS84,1,200,187,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-02-26,BICY,587,NA,26.0342,-81.1123,26.0345,-81.1149,WGS84,314,Cell #AB26,"17N 2879474 E, 488762 N",UTM,WGS84,1,280,587,species,A,A,A +Polygala cruciata,Drumheads,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polycruc2,Human Observation,2002-07-17,BICY,164,NA,26.0432,-81.0379,26.0418,-81.0359,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,130,164,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-11-05,BICY,293,NA,26.0816,-81.2488,26.0816,-81.2464,WGS84,314,Cell #O21,"17N 2884745 E, 475114 N",UTM,WGS84,1,90,293,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-05-15,BICY,642,NA,25.9071,-81.3325,25.9089,-81.3339,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,330,642,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2004-04-15,BICY,339,NA,26.252,-81.045,26.2518,-81.0431,WGS84,314,Cell #AI02,"17N 2903598 E, 495510 N",UTM,WGS84,1,100,339,species,A,A,A +Lobelia feayana,Bay lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobefeay,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-07-01,BICY,703,NA,25.6363,-80.8884,25.638,-80.8869,WGS84,314,Cell #AY70,"17N 2835417 E, 511198 N",UTM,WGS84,1,40,703,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-04-02,BICY,427,NA,26.2477,-80.9374,26.2497,-80.9363,WGS84,314,Cell #AT02,"17N 2903122 E, 506250 N",UTM,WGS84,1,30,427,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Thalia geniculata,"Alligatorflag, Fireflag",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thalgeni,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2003-03-20,BICY,623,NA,25.9562,-81.2046,25.9553,-81.2025,WGS84,314,Cell #S35,"17N 2870852 E, 479514 N",UTM,WGS84,1,115,623,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-20,BICY,637,NA,25.96,-81.1883,25.9606,-81.1856,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,80,637,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2003-03-20,BICY,620,NA,25.9603,-81.2025,25.9583,-81.2015,WGS84,314,Cell #S34,"17N 2871303 E, 479727 N",UTM,WGS84,1,160,620,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2002-05-07,BICY,169,NA,25.8341,-81.0889,25.836,-81.0888,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,0,169,species,A,A,A +Oxalis corniculata,"Lady's-sorrel, Common yellow woodsorrel",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxalcorn,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-06-18,BICY,146,NA,26.1543,-81.3354,26.1543,-81.3329,WGS84,314,"Cell #F13, SE of Miles City","17N 2892813 E, 466479 N",UTM,WGS84,1,90,146,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,478,NA,25.9287,-81.0161,25.9302,-81.0177,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,320,478,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-19,BICY,595,NA,25.9988,-81.2319,25.9991,-81.2342,WGS84,314,Cell #P30,"17N 2875568 E, 476791 N",UTM,WGS84,1,280,595,species,A,A,A +Physalis walteri,Walter's groundcherry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,physwalt,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Hypericum brachyphyllum,Coastalplain St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypebrac,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-06,BICY,571,NA,25.9539,-81.1305,25.9533,-81.1327,WGS84,314,Cell #Z35,"17N 2870588 E, 486932 N",UTM,WGS84,1,260,571,species,A,A,A +Paspalidium geminatum,Egyptian paspalidium,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspgemi,Human Observation,2002-04-09,BICY,173,NA,26.1945,-81.2321,26.193,-81.2342,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,240,173,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-03-25,BICY,691,NA,25.935,-80.9886,25.9353,-80.9865,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,55,691,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-04-17,BICY,662,NA,26.2374,-81.0147,26.2353,-81.0143,WGS84,314,Cell #AL04,"17N 2901980 E, 498527 N",UTM,WGS84,1,175,662,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Hypericum hypericoides,St. Andrew's-cross,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypehype,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Boltonia diffusa,Smallhead Doll's-daisy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boltdiff,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-11,BICY,492,NA,25.8735,-81.2566,25.8756,-81.2553,WGS84,314,Cell #N44,"17N 2861698 E, 474294 N",UTM,WGS84,1,50,492,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-03-19,BICY,628,NA,25.9812,-81.1982,25.9817,-81.1957,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,85,628,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Tillandsia variabilis,"Soft-leaved wild-pine, Leatherleaf airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillvari,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-06-10,BICY,346,NA,26.1497,-81.1964,26.1498,-81.194,WGS84,314,Cell #T13,"17N 2892279 E, 480366 N",UTM,WGS84,1,95,346,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-04-07,BICY,439,NA,26.2498,-81.2265,26.2518,-81.2263,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,0,439,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-06-04,BICY,519,NA,25.8734,-81.343,25.8715,-81.3442,WGS84,314,Cell #E44,"17N 2861714 E, 465639 N",UTM,WGS84,1,215,519,species,A,A,A +Justicia angusta,Narrow-leaved waterwillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,justangu,Human Observation,2003-04-09,BICY,672,NA,26.0927,-81.1845,26.0907,-81.1855,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,210,672,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2004-03-24,BICY,424,NA,25.9726,-81.3357,25.9712,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,140,424,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Oxypolis filiformis,"Water dropwort, Water cowbane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,oxypfili,Human Observation,2003-02-05,BICY,466,NA,26.1795,-80.9152,26.1814,-80.9138,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,30,466,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-11-15,BICY,287,NA,25.8652,-81.3462,25.8656,-81.3485,WGS84,314,Cell #E45,"17N 2860800 E, 465316 N",UTM,WGS84,1,290,287,species,A,A,A +Xyris calcicola,Limestone yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyricalc,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2002-06-04,BICY,269,NA,25.9992,-81.1001,25.9993,-81.1024,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,200,269,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Lythrum alatum var. lanceolatum,Winged loosestrife,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lythalatlanc,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Vittaria lineata,Shoestring fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vittline,Human Observation,2002-08-01,BICY,192,NA,26.1696,-81.2652,26.1718,-81.2654,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,355,192,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Rhynchospora tracyi,Tracy's beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyntrac,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2003-11-26,BICY,476,NA,25.8062,-80.8845,25.804,-80.8852,WGS84,314,Cell #AY51,"17N 2854223 E, 511582 N",UTM,WGS84,1,210,476,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-02-26,BICY,591,NA,26.045,-81.1655,26.0462,-81.1634,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,75,591,species,A,A,A +Sabatia stellaris,Rose-of-Plymouth,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabastel,Human Observation,2004-05-12,BICY,363,NA,25.9823,-80.9107,25.982,-80.9132,WGS84,314,Cell #AV32,"17N 2873723 E, 508938 N",UTM,WGS84,1,270,363,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sorghastrum secundum,Lopsided Indian grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sorgsecu,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Nymphaea odorata,American white waterlily,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympodor,Human Observation,2003-06-18,BICY,697,NA,26.047,-81.1762,26.0447,-81.1762,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,190,697,species,A,A,A +Pteris bahamensis,Bahama ladder brake,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterbaha,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-03-05,BICY,565,NA,26.0211,-81.1145,26.0233,-81.1148,WGS84,314,Cell #AB27,"17N 2878023 E, 488541 N",UTM,WGS84,1,0,565,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2004-05-12,BICY,361,NA,25.9514,-80.9266,25.9534,-80.9257,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,300,361,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2002-09-18,BICY,225,NA,25.7079,-81.0433,25.7099,-81.0433,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,5,225,species,A,A,A +Quercus virginiana,Virginia live oak,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,quervirg,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Mitreola petiolata,"Miterwort, Lax hornpod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mitrpeti,Human Observation,2002-04-09,BICY,172,NA,26.1945,-81.2321,26.1962,-81.2305,WGS84,314,Cell #3950/P08,"17N 2897240 E, 476808 N",UTM,WGS84,1,40,172,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-25,BICY,448,NA,25.9949,-81.2017,25.9955,-81.1994,WGS84,314,Cell #S30,"17N 2875138 E, 479809 N",UTM,WGS84,1,75,448,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-03-05,BICY,567,NA,25.9827,-81.1215,25.9819,-81.1236,WGS84,314,Cell #AA32,"17N 2873774 E, 487840 N",UTM,WGS84,1,250,567,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Iva microcephala,Piedmont marshelder,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ivamicr,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-02-11,BICY,483,NA,25.9591,-81.0174,25.9591,-81.0199,WGS84,314,Cell #AL34,"17N 2871156 E, 498259 N",UTM,WGS84,1,270,483,species,A,A,A +Evolvulus sericeus,Silver dwarf morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,evolseri,Human Observation,2004-03-11,BICY,396,NA,25.7899,-80.9758,25.7919,-80.9773,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,325,396,species,A,A,A +Coelorachis rugosa,Wrinkled jointtail grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coelrugo,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-02-25,BICY,582,NA,26.0014,-81.2179,26.0001,-81.2159,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,130,582,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Rhus copallinum,Winged sumac,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhuscopa,Human Observation,2003-07-09,BICY,725,NA,26.2036,-81.2441,26.2056,-81.2452,WGS84,314,Cell #O07,"17N 2898250 E, 475610 N",UTM,WGS84,1,340,725,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2004-05-20,BICY,392,NA,26.2529,-80.8936,26.2547,-80.895,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,330,392,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-03-07,BICY,556,NA,25.7601,-80.8737,25.7623,-80.8742,WGS84,314,Cell #AZ56,"17N 2849121 E, 512666 N",UTM,WGS84,1,355,556,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-06-18,BICY,698,NA,26.0257,-81.2201,26.0279,-81.2208,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,345,698,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-12-20,BICY,463,NA,26.0673,-81.3019,26.0671,-81.3042,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,270,463,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Asclepias tuberosa,"Butterflyweed, Butterfly milkweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ascltube,Human Observation,2002-05-29,BICY,206,NA,26.1989,-81.2169,26.197,-81.2161,WGS84,314,Cell #R08,"17N 2897730 E, 478329 N",UTM,WGS84,1,170,206,species,A,A,A +Pteridium aquilinum var. caudatum,Lacy braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquicaud,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2003-09-11,BICY,722,NA,25.7538,-80.9274,25.7554,-80.9255,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,55,722,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-07,BICY,130,NA,25.8803,-81.2219,25.881,-81.2243,WGS84,314,"Cell #Q43, East of Burns Lake Rd. Q43","17N 2862448 E, 477773 N",UTM,WGS84,1,290,130,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2002-05-21,BICY,215,NA,26.2303,-80.9066,26.2305,-80.9043,WGS84,314,Cell #AW04,"17N 2901187 E, 509327 N",UTM,WGS84,1,90,215,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-04-24,BICY,179,NA,25.8574,-81.0728,25.8572,-81.0752,WGS84,314,Cell #AF46/1800,"17N 2859896 E, 492708 N",UTM,WGS84,1,270,179,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2003-07-17,BICY,712,NA,26.0832,-80.9373,26.0812,-80.9367,WGS84,314,Cell #AT21,"17N 2884902 E, 506270 N",UTM,WGS84,1,170,712,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2002-08-07,BICY,259,NA,26.1609,-81.2653,26.163,-81.2655,WGS84,314,Cell #M12,"17N 2893533 E, 473488 N",UTM,WGS84,1,0,259,species,A,A,A +Tillandsia flexuosa,"Banded wild-pine, Twisted airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillflex,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Bacopa monnieri,"Water hyssop, Herb-of-grace",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacomonn,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Elytraria caroliniensis var. angustifolia,Narrowleaf Carolina scalystem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,elytcaroangu,Human Observation,2003-02-28,BICY,579,NA,25.7753,-80.9975,25.773,-80.9977,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,190,579,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Cyperus retrorsus,Pinebarren flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cyperetr,Human Observation,2003-09-11,BICY,731,NA,25.7535,-80.9303,25.7514,-80.9309,WGS84,314,Cell #AT57 (originally labeled as #AT54),"17N 2848388 E, 506985 N",UTM,WGS84,1,195,731,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-23,BICY,531,NA,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2002-07-10,BICY,151,NA,26.0769,-81.3107,26.0763,-81.3134,WGS84,314,Cell #H21,"17N 2884234 E, 468923 N",UTM,WGS84,1,265,151,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-03-20,BICY,636,NA,25.96,-81.1883,25.958,-81.1872,WGS84,314,Cell #U34,"17N 2871268 E, 481145 N",UTM,WGS84,1,16,636,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2003-02-11,BICY,482,NA,25.963,-81.0302,25.9653,-81.0305,WGS84,314,Cell #AJ34,"17N 2871588 E, 496977 N",UTM,WGS84,1,0,482,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-08-21,BICY,241,NA,25.9999,-80.9093,25.9979,-80.9085,WGS84,314,Cell #AW30,"17N 2875680 E, 509076 N",UTM,WGS84,1,165,241,species,A,A,A +Schoenus nigricans,"Black sedge, Black bogrush",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schonigr,Human Observation,2002-08-22,BICY,243,NA,25.9059,-81.2415,25.9077,-81.243,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,335,243,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Nephrolepis biserrata,Giant sword fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephbise,Human Observation,2003-05-22,BICY,535,NA,25.8002,-81.1769,25.8013,-81.1751,WGS84,314,Cell #V52,"17N 2853574 E, 482264 N",UTM,WGS84,1,60,535,species,A,A,A +Tillandsia setacea,"Thin-leaved wild-pine, Southern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillseta,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-05-23,BICY,528,NA,25.801,-80.934,25.7989,-80.9342,WGS84,314,Cell #AT52,"17N 2853648 E, 506615 N",UTM,WGS84,1,185,528,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2002-09-18,BICY,232,NA,25.7252,-81.0306,25.723,-81.0311,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,195,232,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2002-08-23,BICY,247,NA,25.8536,-81.2248,25.8527,-81.2226,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,120,247,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-02-06,BICY,456,NA,25.9529,-81.3444,25.9545,-81.3457,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,325,456,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2002-08-01,BICY,193,NA,26.1696,-81.2652,26.1674,-81.2645,WGS84,314,Cell #M11,"17N 2894488 E, 473501 N",UTM,WGS84,1,170,193,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-03-28,BICY,627,NA,25.9163,-81.0604,25.9164,-81.0628,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,280,627,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-03-06,BICY,572,NA,25.9962,-81.129,25.9944,-81.1277,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,15,572,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2002-08-08,BICY,256,NA,26.1826,-80.8868,26.1805,-80.8866,WGS84,314,Cell #AY10,"17N 2895910 E, 511309 N",UTM,WGS84,1,180,256,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-04-23,BICY,657,NA,25.7195,-81.1053,25.7217,-81.1056,WGS84,314,Cell #AC61,"17N 2844622 E, 489441 N",UTM,WGS84,1,0,657,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-24,BICY,324,NA,26.2511,-81.0829,26.2508,-81.0807,WGS84,314,Cell #AE02,"17N 2903496 E, 491719 N",UTM,WGS84,1,90,324,species,A,A,A +Xyris difformis var. floridana,Florida yelloweyed grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,xyridiffflor,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2003-04-09,BICY,673,NA,26.0927,-81.1845,26.0912,-81.1826,WGS84,314,Cell #U20,"17N 2885963 E, 481555 N",UTM,WGS84,1,135,673,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-05-18,BICY,367,NA,26.2061,-81.0978,26.2038,-81.0981,WGS84,314,Cell #AD07,"17N 2898512 E, 490230 N",UTM,WGS84,1,190,367,species,A,A,A +Psychotria sulzneri,Shortleaf wild coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycsulz,Human Observation,2004-03-03,BICY,384,NA,26.1907,-81.3054,26.1888,-81.3065,WGS84,314,Cell #I09,"17N 2896843 E, 469487 N",UTM,WGS84,1,210,384,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2002-07-18,BICY,165,NA,25.9962,-81.081,25.9955,-81.0835,WGS84,314,Cell #AE30,"17N 2875262 E, 491889 N",UTM,WGS84,1,260,165,species,A,A,A +Aster carolinianus,Climbing aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astecaro,Human Observation,2003-03-19,BICY,624,NA,25.9787,-81.2113,25.9764,-81.2118,WGS84,314,Cell #R42,"17N 2873345 E, 478851 N",UTM,WGS84,1,195,624,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2004-04-28,BICY,407,NA,25.8144,-81.0821,25.8167,-81.0824,WGS84,314,Cell #AE50,"17N 2855128 E, 491772 N",UTM,WGS84,1,0,407,species,A,A,A +Pterocaulon pycnostachyum,Blackroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pterpycn,Human Observation,2004-06-24,BICY,322,NA,26.2493,-81.0753,26.2472,-81.0743,WGS84,314,Cell #AF02,"17N 2903294 E, 492483 N",UTM,WGS84,1,20,322,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-04-29,BICY,418,NA,25.8155,-81.0426,25.8146,-81.0412,WGS84,314,Cell #AI50,"17N 2855253 E, 495730 N",UTM,WGS84,1,270,418,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2003-03-11,BICY,639,NA,26.0663,-81.036,26.0683,-81.0369,WGS84,314,Cell #AJ22,"17N 2883026 E, 496401 N",UTM,WGS84,1,340,639,species,A,A,A +Polygala grandiflora,"Candyweed, Showy milkwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,polygran,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Eriocaulon compressum,Flattened pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriocomp,Human Observation,2002-06-05,BICY,265,NA,26.0206,-81.1546,26.0204,-81.1545,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,210,265,species,A,A,A +Cassytha filiformis,"Lovevine, Devil's gut",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cassfili,Human Observation,2002-07-11,BICY,159,NA,26.0975,-81.2848,26.0982,-81.2872,WGS84,314,Cell #K19,"17N 2886508 E, 471520 N",UTM,WGS84,1,295,159,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-02,BICY,354,NA,26.007,-81.0699,26.0067,-81.0674,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,100,354,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Panicum hians,Gaping panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihian,Human Observation,2003-09-11,BICY,723,NA,25.7538,-80.9274,25.7537,-80.9295,WGS84,314,Cell #AU57,"17N 2848426 E, 507282 N",UTM,WGS84,1,270,723,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2002-08-27,BICY,231,NA,26.043,-80.9091,26.0448,-80.9074,WGS84,314,Cell #AW25,"17N 2880453 E, 509098 N",UTM,WGS84,1,45,231,species,A,A,A +Eriocaulon ravenelii,Ravenel's pipewort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eriorave,Human Observation,2002-11-08,BICY,270,NA,25.7556,-81.003,25.7566,-81.0018,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848614 E, 499702 N",UTM,WGS84,1,80,270,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-06-04,BICY,200,NA,25.9853,-81.0968,25.9865,-81.0948,WGS84,314,Cell #AD31,"17N 2874060 E, 490313 N",UTM,WGS84,1,60,200,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-06-13,BICY,505,NA,26.2456,-81.1057,26.2441,-81.1071,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,220,505,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Bidens alba var. radiata,Spanish-needles,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bidealbaradi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Schinus terebinthifolius,Brazilian-pepper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,schitere,Human Observation,2004-04-02,BICY,395,NA,26.2527,-80.9439,26.2531,-80.9415,WGS84,314,Cell #AS02,"17N 2903676 E, 505602 N",UTM,WGS84,1,80,395,species,A,A,A +Eryngium yuccifolium,"Button snakeroot, Button rattlenakemaster",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynyucc,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Cornus foemina,"Stiff cornel, Swamp dogwood, Stiff dogwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cornfoem,Human Observation,2004-03-17,BICY,376,NA,26.1818,-81.343,26.1797,-81.3438,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,220,376,species,A,A,A +Spermacoce terminalis,Everglades Keys false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperterm,Human Observation,2003-02-20,BICY,598,NA,25.9997,-81.1907,26.0008,-81.1928,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,310,598,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Dalea carnea,Whitetassels,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dalecarncarn,Human Observation,2003-02-20,BICY,601,NA,26.0039,-81.1881,26.0061,-81.1882,WGS84,314,Cell #U29,"17N 2876124 E, 481171 N",UTM,WGS84,1,5,601,species,A,A,A +Juncus polycephalos,Manyhead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncpoly,Human Observation,2003-02-27,BICY,576,NA,25.9345,-80.9503,25.9345,-80.9527,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,280,576,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Campyloneurum phyllitidis,Long strap fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,campphyl,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-05-26,BICY,359,NA,25.8254,-81.0222,25.8255,-81.0246,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,280,359,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2002-06-13,BICY,137,NA,26.0401,-81.0673,26.0401,-81.0649,WGS84,314,"Cell #AG25, Middle Pines, near Cal Stone","17N 2880124 E, 493267 N",UTM,WGS84,1,95,137,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-05-18,BICY,365,NA,26.2236,-81.0959,26.2228,-81.0936,WGS84,314,Cell #AD05,"17N 2900452 E, 490421 N",UTM,WGS84,1,130,365,species,A,A,A +Eugenia axillaris,White stopper,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eugeaxil,Human Observation,2004-06-17,BICY,336,NA,26.1778,-81.2369,26.1795,-81.2386,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,315,336,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2004-03-25,BICY,746,NA,26.1979,-81.0858,26.1978,-81.0836,WGS84,314,"Cell #AE08, bearing corrected using arcmap","17N 2897604 E, 491429 N",UTM,WGS84,1,275,746,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-13,BICY,477,NA,25.9287,-81.0161,25.9266,-81.0156,WGS84,314,Cell #AL38,"17N 2867787 E, 498386 N",UTM,WGS84,1,170,477,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-11,BICY,397,NA,25.7899,-80.9758,25.7898,-80.9782,WGS84,314,Cell #AP53,"17N 2852419 E, 502423 N",UTM,WGS84,1,270,397,species,A,A,A +Panicum tenerum,Bluejoint panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panitene,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-06-17,BICY,337,NA,26.1778,-81.2369,26.1803,-81.2368,WGS84,314,Cell #P10,"17N 2895396 E, 476332 N",UTM,WGS84,1,0,337,species,A,A,A +Ficus citrifolia,"Short-leaf fig, Wild banyan tree",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficucitr,Human Observation,2004-03-31,BICY,321,NA,26.1331,-81.0631,26.1352,-81.0633,WGS84,314,Cell #AG15,"17N 2890423 E, 493688 N",UTM,WGS84,1,0,321,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-04-10,BICY,668,NA,26.0691,-81.1605,26.0712,-81.1612,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,350,668,species,A,A,A +Euthamia caroliniana,Slender goldenrod,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,euthcaro,Human Observation,2004-04-08,BICY,441,NA,26.2229,-81.2349,26.2209,-81.236,WGS84,314,Cell #P05,"17N 2900391 E, 476537 N",UTM,WGS84,1,210,441,species,A,A,A +Helenium pinnatifidum,Southeastern sneezeweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,helepinn,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-02-21,BICY,500,NA,26.0012,-80.9317,25.9991,-80.9313,WGS84,314,Cell #AT30,"17N 2875821 E, 506840 N",UTM,WGS84,1,180,500,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2002-06-20,BICY,132,NA,25.8641,-81.1359,25.8632,-81.138,WGS84,314,"Cell #Z45, New River Strand S of Tamiami Trail","17N 2860637 E, 486384 N",UTM,WGS84,1,250,132,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-17,BICY,143,NA,25.8434,-81.104,25.8413,-81.1032,WGS84,314,"Cell #AC47, W of Monroe Station, S of Tamiami Trai","17N 2858349 E, 489583 N",UTM,WGS84,1,170,143,species,A,A,A +Mikania cordifolia,Florida Keys hempvine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikacord,Human Observation,2002-05-31,BICY,128,NA,26.2159,-81.0498,26.2181,-81.0498,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,0,128,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2004-05-12,BICY,360,NA,25.9514,-80.9266,25.9531,-80.928,WGS84,314,Cell #AU35,"17N 2870304 E, 507352 N",UTM,WGS84,1,330,360,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-06-12,BICY,138,NA,26.0416,-81.0282,26.0417,-81.0256,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,90,138,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2004-05-06,BICY,340,NA,26.2422,-81.0507,26.2425,-81.0531,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,280,340,species,A,A,A +Pteridium aquilinum var. pseudocaudatum,Tailed braken fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pteraquipseu,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2002-12-20,BICY,464,NA,26.0673,-81.3019,26.0695,-81.3018,WGS84,314,Cell #I22,"17N 2883173 E, 469804 N",UTM,WGS84,1,5,464,species,A,A,A +Pinguicula pumila,Small butterwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pingpumi,Human Observation,2003-03-18,BICY,615,NA,25.8982,-81.1038,25.8991,-81.1014,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,65,615,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-20,BICY,600,NA,26.0039,-81.1881,26.0052,-81.1863,WGS84,314,"Cell #U29, endpoint estimated using arcmap","17N 2876124 E, 481171 N",UTM,WGS84,1,50,600,species,A,A,A +Fuirena scirpoidea,Southern umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirscir,Human Observation,2003-02-21,BICY,593,NA,25.9996,-81.1574,25.9976,-81.1565,WGS84,314,Cell #X30,"17N 2875653 E, 484250 N",UTM,WGS84,1,165,593,species,A,A,A +Lycium carolinianum,"Christmasberry, Carolina desertthorn",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lycicaro,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Eleocharis geniculata,Canada spikerush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eleogeni,Human Observation,2002-05-28,BICY,211,NA,26.2163,-81.1905,26.2164,-81.1929,WGS84,314,Cell #T06,"17N 2899648 E, 480969 N",UTM,WGS84,1,275,211,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-05-02,BICY,510,NA,26.0974,-81.32,26.0996,-81.3195,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,20,510,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2002-10-31,BICY,277,NA,25.8982,-81.257,25.8971,-81.2595,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,240,277,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2004-04-28,BICY,408,NA,25.8148,-81.0772,25.817,-81.0776,WGS84,314,Cell #AF50,"17N 2855174 E, 492265 N",UTM,WGS84,1,0,408,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-11-08,BICY,289,NA,25.748,-80.9377,25.748,-80.9352,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,95,289,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-13,BICY,479,NA,25.9309,-81.0264,25.9302,-81.0289,WGS84,314,Cell #AK37,"17N 2868028 E, 497353 N",UTM,WGS84,1,250,479,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-03-12,BICY,542,NA,26.0617,-81.0309,26.0596,-81.0308,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,190,542,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-25,BICY,583,NA,26.0014,-81.2179,26.0014,-81.2155,WGS84,314,Cell #R40,"17N 2875853 E, 478198 N",UTM,WGS84,1,90,583,species,A,A,A +Stillingia aquatica,"Corkwood, Water toothleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,stilaqua,Human Observation,2003-02-26,BICY,584,NA,26.0408,-81.1119,26.0406,-81.1141,WGS84,314,Cell #AB25,"17N 2880202 E, 488804 N",UTM,WGS84,1,270,584,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2004-05-26,BICY,358,NA,25.8254,-81.0222,25.824,-81.0243,WGS84,314,Cell #AK49,"17N 2856346 E, 497776 N",UTM,WGS84,1,240,358,species,A,A,A +Lindernia grandiflora,Savannah false-pimpernel,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lindgran,Human Observation,2004-04-01,BICY,327,NA,26.179,-81.0835,26.1788,-81.0859,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,270,327,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2004-03-17,BICY,379,NA,26.186,-81.343,26.1838,-81.3428,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,180,379,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Dyschoriste angusta,"Rockland twinflower, Pineland snakeherb",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dyscangu,Human Observation,2004-03-30,BICY,388,NA,26.1428,-80.8861,26.1411,-80.8845,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,145,388,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-03-05,BICY,569,NA,26.0167,-81.1132,26.0146,-81.1121,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,160,569,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Scleria baldwinii,Baldwin's nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclebald,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Ficus aurea,"Strangler fig, Golden fig",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ficuaure,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Aletris lutea,Yellow colicroot,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,aletlute,Human Observation,2002-09-19,BICY,220,NA,26.1911,-80.8875,26.1922,-80.8853,WGS84,314,Cell #AY09,"17N 2896849 E, 511241 N",UTM,WGS84,1,60,220,species,A,A,A +Scleria georgiana,Slenderfruit nutrush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sclegeor,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-02-04,BICY,469,NA,25.8418,-81.0023,25.8436,-81.0038,WGS84,314,Cell #AM47,"17N 2858162 E, 499774 N",UTM,WGS84,1,330,469,species,A,A,A +Dichanthelium dichotomum,Cypress witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichdich,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Sabatia bartramii,Bartram's rosegentian,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sababart,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Nymphoides aquatica,Big floatingheart,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nympaqua,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2002-05-29,BICY,204,NA,25.9464,-81.2971,25.9444,-81.2968,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,180,204,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2004-03-26,BICY,414,NA,26.2242,-81.0649,26.2242,-81.0674,WGS84,314,Cell #AG05,"17N 2900516 E, 493515 N",UTM,WGS84,1,270,414,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-03-07,BICY,558,NA,25.7369,-80.9716,25.7351,-80.973,WGS84,314,Cell #AP59,"17N 2846549 E, 502853 N",UTM,WGS84,1,220,558,species,A,A,A +Fraxinus caroliniana,"Water ash, Carolina ash, Pop ash",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fraxcaro,Human Observation,2004-06-03,BICY,353,NA,26.0243,-81.0653,26.0246,-81.0678,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,295,353,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2003-06-04,BICY,521,NA,25.8672,-81.353,25.8687,-81.3513,WGS84,314,Cell #D44 (originally labeled E45),"17N 2861021 E, 464635 N",UTM,WGS84,1,60,521,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Aster subulatus,Annual saltmarsh aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astesubu,Human Observation,2002-11-14,BICY,284,NA,26.0767,-81.272,26.0774,-81.2743,WGS84,314,Cell #L21,"17N 2884209 E, 472799 N",UTM,WGS84,1,290,284,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-03-25,BICY,681,NA,25.9646,-81.2476,25.9632,-81.2495,WGS84,314,Cell #O34,"17N 2871789 E, 475210 N",UTM,WGS84,1,235,681,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-06-03,BICY,515,NA,25.717,-81.0562,25.7186,-81.0581,WGS84,314,Cell #AH61,"17N 2844349 E, 494364 N",UTM,WGS84,1,320,515,species,A,A,A +Utricularia subulata,Zigzag bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrisubu,Human Observation,2003-05-14,BICY,640,NA,26.1761,-81.1817,26.1789,-81.1821,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,0,640,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Tillandsia usneoides,Spanish-moss,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillusne,Human Observation,2003-06-19,BICY,740,NA,25.8843,-80.8461,25.8837,-80.8484,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,255,740,species,A,A,A +Eupatorium mohrii,Mohr's thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamohr,Human Observation,2004-05-13,BICY,430,NA,25.9072,-81.2737,25.9054,-81.2743,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,220,430,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2003-09-16,BICY,719,NA,26.1624,-81.0283,26.1609,-81.026,WGS84,314,Cell #AK12,"17N 2893665 E, 497173 N",UTM,WGS84,1,130,719,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2002-07-31,BICY,253,NA,26.0454,-81.3423,26.0451,-81.3397,WGS84,314,Cell #E25,"17N 2880757 E, 465755 N",UTM,WGS84,1,110,253,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-04-29,BICY,606,NA,25.8642,-81.2501,25.8627,-81.2519,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,230,606,species,A,A,A +NA,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cf. spermacoce floridana,Human Observation,2003-03-13,BICY,633,Spermococe cf floridana,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,NA,A,R,A +Paspalum conjugatum,"Sour paspalum, Hilograss",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspconj,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Tillandsia balbisiana,"Reflexed wild-pine, Northern needleleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillbalb,Human Observation,2004-06-22,BICY,311,NA,26.1685,-81.2779,26.1706,-81.2771,WGS84,314,Cell #L11,"17N 2894377 E, 472231 N",UTM,WGS84,1,25,311,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2003-02-27,BICY,588,NA,26.0397,-81.1252,26.0401,-81.1231,WGS84,314,Cell #AA25,"17N 2880083 E, 487479 N",UTM,WGS84,1,85,588,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-05-21,BICY,216,NA,26.2511,-80.9297,26.2535,-80.9293,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,5,216,species,A,A,A +Boehmeria cylindrica,"Button-hemp, False nettle, Bog hemp",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,boehcyli,Human Observation,2003-05-13,BICY,611,NA,26.1457,-81.2422,26.1447,-81.2445,WGS84,314,Cell #O14,"17N 2891842 E, 475791 N",UTM,WGS84,1,265,611,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-05-14,BICY,641,NA,26.1761,-81.1817,26.1759,-81.1846,WGS84,314,Cell #U10,"17N 2895202 E, 481846 N",UTM,WGS84,1,270,641,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-02-11,BICY,490,NA,26.0752,-81.293,26.0774,-81.2932,WGS84,314,Cell #J21,"17N 2884040 E, 470692 N",UTM,WGS84,1,5,490,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,416,NA,26.2163,-81.0953,26.2174,-81.0932,WGS84,314,Cell #AJ06,"17N 2899645 E, 490479 N",UTM,WGS84,1,70,416,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2003-04-10,BICY,666,NA,26.1004,-81.1641,26.0983,-81.1641,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,190,666,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-19,BICY,596,NA,26.0084,-81.2316,26.0063,-81.2316,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,190,596,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-07-17,BICY,714,NA,25.8076,-81.214,25.8094,-81.2151,WGS84,314,Cell #R61,"17N 2854390 E, 478553 N",UTM,WGS84,1,340,714,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-02-27,BICY,575,NA,25.9273,-80.9622,25.9258,-80.9605,WGS84,314,Cell #AQ38,"17N 2867634 E, 503783 N",UTM,WGS84,1,140,575,species,A,A,A +Eremochloa ophiuroides,Centipede grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eremophi,Human Observation,2004-05-20,BICY,393,NA,26.2529,-80.8936,26.2541,-80.8915,WGS84,314,Cell #AX02,"17N 2903700 E, 510627 N",UTM,WGS84,1,60,393,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2003-05-27,BICY,451,NA,25.749,-80.8746,25.7489,-80.8775,WGS84,314,Cell #AZ58,"17N 2847898 E, 512578 N",UTM,WGS84,1,270,451,species,A,A,A +Ludwigia alata,Winged primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwalat,Human Observation,2003-02-05,BICY,465,NA,26.1795,-80.9152,26.1798,-80.9177,WGS84,314,Cell #AV10,"17N 2895561 E, 508470 N",UTM,WGS84,1,280,465,species,A,A,A +Lobelia glandulosa,Glade lobelia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,lobeglan,Human Observation,2002-11-05,BICY,280,NA,25.8708,-81.2282,25.8686,-81.228,WGS84,314,Cell #Q44,"17N 2861398 E, 477142 N",UTM,WGS84,1,180,280,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-03-28,BICY,626,NA,25.9163,-81.0604,25.9183,-81.0611,WGS84,314,Cell #AG39,"17N 2866413 E, 493955 N",UTM,WGS84,1,350,626,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-31,BICY,202,NA,26.2044,-81.066,26.2022,-81.0659,WGS84,314,Cell #AG07,"17N 2898326 E, 493407 N",UTM,WGS84,1,180,202,species,A,A,A +Senna ligustrina,"Privet senna, Privet wild sensitive plant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sennligu,Human Observation,2003-05-23,BICY,531,Senna species,25.8048,-80.9224,25.8046,-80.9249,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,270,531,species,A,A,A +Parthenocissus quinquefolia,"Virginia-creeper, Woodbine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,partquin,Human Observation,2003-06-13,BICY,504,NA,26.2456,-81.1057,26.2438,-81.1047,WGS84,314,Cell #AC03,"17N 2902890 E, 489446 N",UTM,WGS84,1,160,504,species,A,A,A +Rhynchospora odorata,Fragrant beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynodor,Human Observation,2004-04-14,BICY,420,NA,26.2176,-81.0845,26.2191,-81.0828,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,50,420,species,A,A,A +Canna flaccida,"Golden canna, Bandana-of-the-everglades",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cannflac,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2003-03-06,BICY,554,NA,26.2322,-81.3052,26.2335,-81.3074,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,310,554,species,A,A,A +Utricularia purpurea,Eastern purple bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utripurp,Human Observation,2003-03-12,BICY,631,NA,26.0746,-81.0252,26.0725,-81.0244,WGS84,314,Cell #AK22,"17N 2883951 E, 497476 N",UTM,WGS84,1,180,631,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2003-04-24,BICY,613,NA,25.7194,-81.0846,25.7216,-81.0853,WGS84,314,Cell #AE61,"17N 2844609 E, 491518 N",UTM,WGS84,1,345,613,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-09,BICY,683,NA,26.0881,-81.1551,26.0859,-81.1554,WGS84,314,Cell #X20,"17N 2885455 E, 484489 N",UTM,WGS84,1,190,683,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Sagittaria graminea var. chapmanii,Chapman's arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagigramchap,Human Observation,2002-08-23,BICY,246,NA,25.8536,-81.2248,25.8555,-81.2262,WGS84,314,Cell #Q46,"17N 2859495 E, 477474 N",UTM,WGS84,1,330,246,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-04-16,BICY,661,NA,26.2547,-81.0622,26.255,-81.0642,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,280,661,species,A,A,A +Mikania scandens,"Climbing hempweed, Climbing hempvine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,mikascan,Human Observation,2003-03-19,BICY,629,NA,25.9812,-81.1982,25.9791,-81.1982,WGS84,314,Cell #T32,"17N 2873621 E, 480164 N",UTM,WGS84,1,190,629,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-08,BICY,135,NA,25.8891,-81.067,25.8905,-81.065,WGS84,314,"Cell #AG42, endpoint estimated using arcmap","17N 2863405 E, 493293 N",UTM,WGS84,1,45,135,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-31,BICY,319,NA,26.1349,-81.057,26.1335,-81.055,WGS84,314,Cell #AH15,"17N 2890624 E, 494305 N",UTM,WGS84,1,130,319,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2002-06-04,BICY,268,NA,25.9992,-81.1001,25.9993,-81.1023,WGS84,314,Cell #AC30,"17N 2875600 E, 489986 N",UTM,WGS84,1,225,268,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-02-20,BICY,495,NA,25.9569,-80.947,25.9559,-80.9449,WGS84,314,Cell #AS35,"17N 2870917 E, 505304 N",UTM,WGS84,1,125,495,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-05-02,BICY,511,NA,26.0974,-81.32,26.098,-81.3178,WGS84,314,Cell #H19,"17N 2886505 E, 468000 N",UTM,WGS84,1,75,511,species,A,A,A +Gratiola ramosa,Branched hedgehyssop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,gratramo,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-06-06,BICY,509,NA,26.1338,-80.9446,26.1337,-80.9422,WGS84,314,Cell #AS15,"17N 2890502 E, 505535 N",UTM,WGS84,1,100,509,species,A,A,A +Panicum hemitomon,Maidencane,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panihemi,Human Observation,2003-05-02,BICY,655,NA,26.2526,-81.1916,26.252,-81.1939,WGS84,314,Cell #T02,"17N 2903667 E, 480866 N",UTM,WGS84,1,260,655,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,648,NA,25.8875,-81.049,25.8894,-81.0484,WGS84,314,Cell #AI42,"17N 2863229 E, 495090 N",UTM,WGS84,1,30,648,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-06-03,BICY,516,NA,25.7102,-81.0764,25.7104,-81.0789,WGS84,314,Cell #AF62,"17N 2843594 E, 492335 N",UTM,WGS84,1,280,516,species,A,A,A +Thelypteris palustris var. pubescens,Marsh fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelpalupube,Human Observation,2004-06-22,BICY,313,NA,26.1627,-81.2799,26.1606,-81.2794,WGS84,314,Cell #L12,"17N 2893733 E, 472025 N",UTM,WGS84,1,180,313,species,A,A,A +Sagittaria lancifolia,Bulltongue arrowhead,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sagilanc,Human Observation,2003-07-09,BICY,721,NA,26.2346,-81.285,26.2353,-81.2871,WGS84,314,Cell #K04,"17N 2901693 E, 471533 N",UTM,WGS84,1,290,721,species,A,A,A +Spartina bakeri,Sand cordgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sparbake,Human Observation,2003-03-06,BICY,573,NA,25.9962,-81.129,25.9956,-81.1266,WGS84,314,Cell #AA30,"17N 2875269 E, 487086 N",UTM,WGS84,1,110,573,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-08-29,BICY,249,NA,25.7858,-81.0958,25.7852,-81.0936,WGS84,314,Cell #AD54,"17N 2851968 E, 490392 N",UTM,WGS84,1,110,249,species,A,A,A +Chiococca parvifolia,Pineland snowberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chioparv,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Rhynchospora divergens,Spreading beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyndive,Human Observation,2003-04-10,BICY,667,NA,26.1004,-81.1641,26.0986,-81.1655,WGS84,314,Cell #W19,"17N 2886815 E, 483592 N",UTM,WGS84,1,220,667,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-07-11,BICY,155,NA,26.1057,-81.284,26.1035,-81.2833,WGS84,314,Cell #K18,"17N 2887417 E, 471604 N",UTM,WGS84,1,170,155,species,A,A,A +Melochia spicata,Bretonica peluda,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melospic,Human Observation,2004-04-07,BICY,432,NA,26.25,-81.2548,26.2478,-81.2547,WGS84,314,Cell #N02,"17N 2903396 E, 474557 N",UTM,WGS84,1,180,432,species,A,A,A +Solidago stricta,"Narrow-leaved goldenrod, Wand goldenrod",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,solistri,Human Observation,2003-01-04,BICY,459,NA,26.2036,-80.9318,26.203,-80.934,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,250,459,species,A,A,A +Typha domingensis,Southern cat-tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,typhdomi,Human Observation,2002-05-20,BICY,190,NA,25.7828,-80.8764,25.7807,-80.8773,WGS84,314,"Cell #AZ54, inside Loop Rd.","17N 2851635 E, 512389 N",UTM,WGS84,1,205,190,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-23,BICY,237,NA,25.8448,-81.2201,25.8466,-81.2215,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,330,237,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2002-08-22,BICY,242,NA,25.9059,-81.2415,25.9053,-81.2441,WGS84,314,Cell #O40,"17N 2865287 E, 475811 N",UTM,WGS84,1,260,242,species,A,A,A +Toxicodendron radicans,Eastern poison-ivy,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,toxiradi,Human Observation,2004-06-10,BICY,315,NA,26.1551,-81.1871,26.1539,-81.1851,WGS84,314,Cell #U13,"17N 2892878 E, 481301 N",UTM,WGS84,1,125,315,species,A,A,A +Juncus megacephalus,Bighead rush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,juncmega,Human Observation,2003-04-08,BICY,674,NA,26.0673,-81.1525,26.0695,-81.1521,WGS84,314,"Cell #X22, endpoint corrected using arcmap","17N 2883144 E, 484751 N",UTM,WGS84,1,15,674,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-05-24,BICY,533,NA,25.8115,-81.1422,25.8129,-81.1407,WGS84,314,Cell #Y51,"17N 2854812 E, 485751 N",UTM,WGS84,1,40,533,species,A,A,A +Quercus laurifolia,"Laurel oak, Diamond oak",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,querlaur,Human Observation,2002-05-22,BICY,219,NA,25.7737,-81.0393,25.7735,-81.0388,WGS84,314,Cell #AJ55 (North of Loop Road),"17N 2850623 E, 496063 N",UTM,WGS84,1,155,219,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2003-02-07,BICY,493,NA,25.8691,-81.0272,25.8679,-81.0294,WGS84,314,Cell #AK44,"17N 2861184 E, 497273 N",UTM,WGS84,1,250,493,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-28,BICY,684,NA,25.9193,-81.0491,25.9181,-81.047,WGS84,314,Cell #AI39,"17N 2866752 E, 495080 N",UTM,WGS84,1,130,684,species,A,A,A +Iris hexagona,"Dixie iris, Prairie iris",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,irishexa,Human Observation,2004-05-04,BICY,342,NA,25.863,-81.1021,25.8628,-81.1046,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,270,342,species,A,A,A +Ilex cassine,"Dahoon holly, Dahoon",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ilexcass,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Persea palustris,Swamp bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,perspalu,Human Observation,2002-09-17,BICY,223,NA,25.6988,-80.9736,25.7,-80.9758,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,310,223,species,A,A,A +Samolus ebracteatus,"Water pimpernel, Limewater brookweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,samoebra,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Melaleuca quinquenervia,Punktree,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melaquin,Human Observation,2002-06-17,BICY,145,NA,25.8329,-81.1112,25.8339,-81.1134,WGS84,314,"Cell #AB48, W of Monroe Station S of Tamiami Trai","17N 2857179 E, 488852 N",UTM,WGS84,1,305,145,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2004-05-07,BICY,368,NA,25.7236,-80.9208,25.7257,-80.9206,WGS84,314,Cell #AU60,"17N 2845078 E, 507948 N",UTM,WGS84,1,0,368,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-31,BICY,203,NA,26.2044,-81.066,26.2044,-81.066,WGS84,314,Cell #AG07 (was mislabeled as AD31),"17N 2898326 E, 493407 N",UTM,WGS84,1,50,203,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2004-03-17,BICY,377,NA,26.1818,-81.343,26.1802,-81.3413,WGS84,314,Cell #E10,"17N 2895858 E, 465728 N",UTM,WGS84,1,150,377,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2002-05-29,BICY,205,NA,25.9464,-81.2971,25.9466,-81.2971,WGS84,314,Cell #J36,"17N 2869783 E, 470257 N",UTM,WGS84,1,270,205,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Hedyotis uniflora,Clustered mille graine,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hedyunif,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-04-08,BICY,675,NA,26.0673,-81.1525,26.0673,-81.155,WGS84,314,Cell #X22,"17N 2883144 E, 484751 N",UTM,WGS84,1,270,675,species,A,A,A +Rhynchospora inundata,Narrowfruit horned beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyninun,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2003-05-09,BICY,650,NA,25.8993,-81.0752,25.9015,-81.075,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,10,650,species,A,A,A +Aster bracei,Brace's aster,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,astebrac,Human Observation,2003-02-28,BICY,578,NA,25.7753,-80.9975,25.775,-80.9999,WGS84,314,Cell #AN55,"17N 2850797 E, 500253 N",UTM,WGS84,1,265,578,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-02-19,BICY,597,NA,26.0084,-81.2316,26.0087,-81.2339,WGS84,314,Cell #P29,"17N 2876637 E, 476826 N",UTM,WGS84,1,280,597,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2003-04-17,BICY,665,NA,26.2321,-81.0449,26.2297,-81.0447,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,180,665,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-06-12,BICY,503,NA,25.8961,-81.1523,25.8979,-81.1507,WGS84,314,Cell #X41,"17N 2864187 E, 484747 N",UTM,WGS84,1,50,503,species,A,A,A +Sarcostemma clausum,"Whitevine, White twinevine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sarcclau,Human Observation,2003-06-19,BICY,741,NA,25.8843,-80.8461,25.8826,-80.8465,WGS84,314,Cell #BC43,"17N 2862884 E, 515418 N",UTM,WGS84,1,180,741,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-05-29,BICY,538,NA,25.7563,-80.9028,25.7582,-80.9038,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,350,538,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2003-06-18,BICY,699,NA,26.0257,-81.2201,26.0263,-81.2225,WGS84,314,Cell #Q27,"17N 2878553 E, 477980 N",UTM,WGS84,1,290,699,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-22,BICY,244,NA,25.9154,-81.2418,25.9144,-81.2439,WGS84,314,"Cell #O39, endpoint corrected using arcmap","17N 2866336 E, 475780 N",UTM,WGS84,1,245,244,species,A,A,A +Cynanchum blodgettii,Blodgett's swallowwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cynablod,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Andropogon virginicus var. glaucus,Chalky bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrvirgglau,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2004-03-30,BICY,389,NA,26.1428,-80.8861,26.142,-80.8883,WGS84,314,Cell #AY14,"17N 2891503 E, 511389 N",UTM,WGS84,1,250,389,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2002-09-17,BICY,222,NA,25.6988,-80.9736,25.6966,-80.974,WGS84,314,Cell #AP63,"17N 2842329 E, 502644 N",UTM,WGS84,1,200,222,species,A,A,A +Sisyrinchium angustifolium,Narroleaf blueeyed-grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sisyangu,Human Observation,2003-03-04,BICY,562,NA,26.0403,-81.0942,26.042,-81.0956,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,320,562,species,A,A,A +Dichanthelium erectifolium,Erectleaf witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dicherec,Human Observation,2003-03-11,BICY,546,NA,26.1881,-81.0574,26.1859,-81.0576,WGS84,314,Cell #AH09,"17N 2896517 E, 494269 N",UTM,WGS84,1,190,546,species,A,A,A +Utricularia foliosa,Leafy bladderwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,utrifoli,Human Observation,2004-05-13,BICY,431,NA,25.9072,-81.2737,25.9078,-81.2714,WGS84,314,Cell #L40,"17N 2865437 E, 472583 N",UTM,WGS84,1,75,431,species,A,A,A +Pontederia cordata,Pickerelweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pontcord,Human Observation,2003-05-22,BICY,523,NA,25.9615,-80.8461,25.963,-80.8442,WGS84,314,Cell #BC34,"17N 2871431 E, 515404 N",UTM,WGS84,1,50,523,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-13,BICY,634,NA,26.065,-81.0271,26.0629,-81.0261,WGS84,314,Cell #AK23,"17N 2882885 E, 497287 N",UTM,WGS84,1,160,634,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2003-03-18,BICY,614,NA,25.8982,-81.1038,25.8962,-81.104,WGS84,314,Cell #AC41,"17N 2864411 E, 489601 N",UTM,WGS84,1,190,614,species,A,A,A +Melothria pendula,Creeping-cucumber,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,melopend,Human Observation,2004-05-05,BICY,330,NA,26.2506,-81.0295,26.2484,-81.0298,WGS84,314,Cell #AK02,"17N 2903435 E, 497051 N",UTM,WGS84,1,185,330,species,A,A,A +Eragrostis elliottii,Elliott's love grass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eragelli,Human Observation,2003-02-27,BICY,577,NA,25.9345,-80.9503,25.9324,-80.9514,WGS84,314,Cell #AR37,"17N 2868429 E, 504977 N",UTM,WGS84,1,210,577,species,A,A,A +Vaccinium myrsinites,Shiny blueberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vaccmyrs,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Cladium jamaicense,"Saw-grass, Jamaica swamp sawgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cladjama,Human Observation,2002-09-18,BICY,224,NA,25.7079,-81.0433,25.7064,-81.0452,WGS84,314,Cell #AI62,"17N 2843334 E, 495652 N",UTM,WGS84,1,235,224,species,A,A,A +Piriqueta caroliniana,Pitted stripeseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,piricaro,Human Observation,2003-02-20,BICY,599,NA,25.9997,-81.1907,25.9983,-81.1925,WGS84,314,Cell #T30,"17N 2875659 E, 480919 N",UTM,WGS84,1,240,599,species,A,A,A +Diodia virginiana,"Buttonweed, Virginia buttonweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,diodvirg,Human Observation,2003-05-09,BICY,651,NA,25.8993,-81.0752,25.8992,-81.0729,WGS84,314,Cell #AF41,"17N 2864531 E, 492472 N",UTM,WGS84,1,85,651,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-13,BICY,633,NA,26.0488,-81.0668,26.0487,-81.0641,WGS84,314,Cell #AG24,"17N 2881089 E, 493320 N",UTM,WGS84,1,100,633,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-03-11,BICY,398,NA,25.7817,-80.9812,25.7817,-80.9837,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,270,398,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2002-05-21,BICY,217,NA,26.2511,-80.9297,26.25,-80.9279,WGS84,314,Cell #AU02,"17N 2903494 E, 507020 N",UTM,WGS84,1,130,217,species,A,A,A +Hyptis alata,"Musky mint, Clustered bushmint",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hyptalat,Human Observation,2003-06-12,BICY,502,NA,25.8961,-81.1523,25.8982,-81.1514,WGS84,314,"Cell #X41, endpoint estimated using arcmap","17N 2864187 E, 484747 N",UTM,WGS84,1,15,502,species,A,A,A +Cephalanthus occidentalis,Common buttonbush,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cephocci,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Blechnum serrulatum,"Swamp fern, Toothed midsorus fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,blecserr,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Dichanthelium commutatum,Variable witchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,dichcomm,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Crinum americanum,"Swamp-lily, Seven-sisters, String-lily",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,crinamer,Human Observation,2004-03-24,BICY,425,NA,25.9726,-81.3357,25.9744,-81.3339,WGS84,314,Cell #F33,"17N 2872694 E, 466400 N",UTM,WGS84,1,45,425,species,A,A,A +Saururus cernuus,Lizard's tail,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saurcern,Human Observation,2002-05-09,BICY,182,NA,25.9254,-80.8441,25.927,-80.8422,WGS84,314,Cell #BC38,"17N 2867427 E, 515616 N",UTM,WGS84,1,50,182,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-29,BICY,279,NA,26.1134,-81.2906,26.1113,-81.2902,WGS84,314,Cell #J17,"17N 2888274 E, 470944 N",UTM,WGS84,1,175,279,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Encyclia tampensis,Florida butterfly orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,encytamp,Human Observation,2004-03-24,BICY,371,NA,25.9769,-81.3355,25.9771,-81.333,WGS84,314,Cell #F32,"17N 2873174 E, 466418 N",UTM,WGS84,1,90,371,species,A,A,A +Vitis cinerea var. floridana,Florida grape,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,viticineflor,Human Observation,2003-03-13,BICY,739,NA,25.7616,-80.9307,25.7635,-80.9312,WGS84,314,Cell #AT56,"17N 2849280 E, 506953 N",UTM,WGS84,1,350,739,species,A,A,A +Elionurus tripsacoides,Pan-American balsamscale,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eliotrip,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2003-05-22,BICY,536,NA,25.7995,-81.1676,25.8013,-81.1668,WGS84,314,Cell #W52,"17N 2853490 E, 483199 N",UTM,WGS84,1,30,536,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Chrysobalanus icaco,Coco-plum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,chryicac,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Rhynchospora colorata,Starrush whitetop,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhyncolo,Human Observation,2002-05-07,BICY,168,NA,25.8341,-81.0889,25.8317,-81.0883,WGS84,314,"Cell #AE48, W. of Loop Rd. S of Monroe","17N 2857310 E, 491088 N",UTM,WGS84,1,170,168,species,A,A,A +Phyllanthus caroliniensis subsp. saxicola,Rock Carolina leafflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phylcarosaxi,Human Observation,2002-11-08,BICY,271,NA,25.7561,-81.0054,25.7563,-81.0064,WGS84,314,"Cell #AM57, origin estimated with ARCMap","17N 2848673 E, 499461 N",UTM,WGS84,1,280,271,species,A,A,A +Psychotria nervosa,Shiny-leaved wild-coffee,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,psycnerv,Human Observation,2004-05-07,BICY,297,NA,25.7238,-80.9174,25.7236,-80.9199,WGS84,314,"Cell #AV60, Hess Hammock","17N 2845103 E, 508290 N",UTM,WGS84,1,270,297,species,A,A,A +Rapanea punctata,"Myrsine, Colicwood",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rapapunc,Human Observation,2003-03-04,BICY,561,NA,26.0296,-81.0943,26.0282,-81.0962,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,245,561,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-04-29,BICY,607,NA,25.8642,-81.2501,25.8662,-81.252,WGS84,314,Cell #N45,"17N 2860672 E, 474942 N",UTM,WGS84,1,320,607,species,A,A,A +Paspalum monostachyum,Gulfdune paspalum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,paspmono,Human Observation,2002-06-12,BICY,139,NA,26.0416,-81.0282,26.0437,-81.0284,WGS84,314,"Cell #AK25, Middle Pines, east of Cal Stone","17N 2880288 E, 497181 N",UTM,WGS84,1,355,139,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2003-03-04,BICY,563,NA,26.0403,-81.0942,26.0419,-81.0923,WGS84,314,Cell #AD25,"17N 2880145 E, 490578 N",UTM,WGS84,1,50,563,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-03-12,BICY,543,NA,26.0617,-81.0309,26.0631,-81.0327,WGS84,314,Cell #AJ23,"17N 2882518 E, 496908 N",UTM,WGS84,1,315,543,species,A,A,A +Hypericum cistifolium,Roundpod St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypecist,Human Observation,2004-06-02,BICY,356,NA,25.9555,-81.0064,25.9541,-81.0043,WGS84,314,Cell #AM35,"17N 2870752 E, 499364 N",UTM,WGS84,1,135,356,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Taxodium ascendens,Pond cypress,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,taxoasce,Human Observation,2004-03-11,BICY,399,NA,25.7817,-80.9812,25.7801,-80.9827,WGS84,314,Cell #AO54,"17N 2851513 E, 501882 N",UTM,WGS84,1,225,399,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-07-31,BICY,195,NA,26.0499,-81.3429,26.0497,-81.3404,WGS84,314,"Cell #E24, Deep Lake","17N 2881252 E, 465701 N",UTM,WGS84,1,100,195,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-05-29,BICY,539,NA,25.7563,-80.9028,25.7583,-80.9018,WGS84,314,Cell #AW57,"17N 2848699 E, 509752 N",UTM,WGS84,1,35,539,species,A,A,A +Erigeron quercifolius,"Southern-fleabane, Oakleaf fleabane",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erigquer,Human Observation,2004-04-07,BICY,438,NA,26.2498,-81.2265,26.2476,-81.2262,WGS84,314,Cell #Q02,"17N 2903369 E, 477380 N",UTM,WGS84,1,180,438,species,A,A,A +Serenoa repens,Saw palmetto,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sererepe,Human Observation,2004-06-01,BICY,317,NA,25.9346,-81.0368,25.9348,-81.0343,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,85,317,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-02-06,BICY,455,NA,25.9529,-81.3444,25.9541,-81.3422,WGS84,314,Cell #E35,"17N 2870515 E, 465524 N",UTM,WGS84,1,65,455,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2004-04-01,BICY,326,NA,26.179,-81.0835,26.1777,-81.0817,WGS84,314,Cell #AE10,"17N 2895514 E, 491661 N",UTM,WGS84,1,140,326,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2003-09-10,BICY,729,NA,26.2428,-80.9525,26.243,-80.9549,WGS84,314,Cell #AR03,"17N 2902579 E, 504740 N",UTM,WGS84,1,275,729,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Phlebodium aureum,Golden polypody,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,phleaure,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-17,BICY,664,NA,26.2321,-81.0449,26.2343,-81.0448,WGS84,314,Cell #AI04,"17N 2901387 E, 495513 N",UTM,WGS84,1,10,664,species,A,A,A +Tillandsia utriculata,"Giant wild-pine, Giant airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillutri,Human Observation,2004-04-06,BICY,422,NA,25.7633,-80.9177,25.7614,-80.919,WGS84,314,Cell #AV56,"17N 2849471 E, 508257 N",UTM,WGS84,1,315,422,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-06-05,BICY,264,NA,26.0206,-81.1546,26.0206,-81.1546,WGS84,314,Cell #X28,"17N 2877975 E, 484532 N",UTM,WGS84,1,160,264,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2004-03-25,BICY,745,NA,26.21,-81.0892,26.2079,-81.0878,WGS84,314,Cell #AE07,"17N 2898939 E, 491088 N",UTM,WGS84,1,140,745,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2003-06-18,BICY,696,NA,26.047,-81.1762,26.0461,-81.1739,WGS84,314,Cell #V25,"17N 2880903 E, 482375 N",UTM,WGS84,1,125,696,species,A,A,A +Smilax auriculata,Earleaf greenbrier,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smilauri,Human Observation,2003-09-09,BICY,737,NA,26.1814,-81.244,26.1817,-81.2461,WGS84,314,Cell #O10,"17N 2895793 E, 475619 N",UTM,WGS84,1,290,737,species,A,A,A +Saccharum giganteum,Sugarcane plumegrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,saccgiga,Human Observation,2004-06-01,BICY,316,NA,25.9346,-81.0368,25.9352,-81.0391,WGS84,314,Cell #AJ37,"17N 2868446 E, 496319 N",UTM,WGS84,1,300,316,species,A,A,A +Rudbeckia hirta,Blackeyed susan,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rudbhirt,Human Observation,2004-05-05,BICY,329,NA,26.2408,-81.0341,26.2394,-81.0359,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,240,329,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2004-05-13,BICY,428,NA,25.8978,-81.2753,25.8964,-81.2736,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,130,428,species,A,A,A +Spermacoce assurgens,Woodland false buttonweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sperassu,Human Observation,2003-05-23,BICY,530,NA,25.8048,-80.9224,25.8066,-80.9227,WGS84,314,Cell #AU51,"17N 2854064 E, 507777 N",UTM,WGS84,1,5,530,species,A,A,A +Eupatorium serotinum,Lateflowering thoroughwort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupasero,Human Observation,2004-05-06,BICY,341,NA,26.2422,-81.0507,26.24,-81.0504,WGS84,314,Cell #AH03,"17N 2902502 E, 494939 N",UTM,WGS84,1,175,341,species,A,A,A +Ruellia succulenta,Thickleaf wild petunia,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ruelsucc,Human Observation,2002-07-17,BICY,163,NA,26.0432,-81.0379,26.0411,-81.0375,WGS84,314,"Cell #AJ25, Central Pines","17N 2880474 E, 496209 N",UTM,WGS84,1,180,163,species,A,A,A +Spiranthes odorata,"Fragrant lady's-tresses, Marsh lady's-tresses",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,spirodor,Human Observation,2004-06-08,BICY,348,NA,25.8547,-81.0005,25.8568,-81.0001,WGS84,314,Cell #AM46,"17N 2859588 E, 499945 N",UTM,WGS84,1,30,348,species,A,A,A +Acer rubrum,Red maple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,acerrubr,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Randia aculeata,White indigoberry,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,randacul,Human Observation,2003-01-04,BICY,460,NA,26.2036,-80.9318,26.2058,-80.9315,WGS84,314,Cell #AT07,"17N 2898234 E, 506815 N",UTM,WGS84,1,10,460,species,A,A,A +Berchemia scandens,"rattan vine, Alabama supplejack",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bercscan,Human Observation,2003-09-10,BICY,726,NA,26.2131,-81.3056,26.2109,-81.3057,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,195,726,species,A,A,A +Magnolia virginiana,Sweet-bay,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,magnvirg,Human Observation,2003-11-26,BICY,474,NA,25.8255,-80.9092,25.8276,-80.9083,WGS84,314,Cell #AW49,"17N 2856359 E, 509099 N",UTM,WGS84,1,15,474,species,A,A,A +Thelypteris interrupta,"Interrupted maiden fern, Hottentot fern",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelinte,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Nephrolepis exaltata,Wild Boston fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,nephexal,Human Observation,2002-08-09,BICY,260,NA,26.1786,-81.0048,26.18,-81.0071,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,285,260,species,A,A,A +Muhlenbergia capillaris,"Muhlygrass, Hairawnmuhly",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,muhlcapi,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Hydrolea corymbosa,Skyflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrcory,Human Observation,2002-11-05,BICY,272,NA,25.9062,-81.22,25.9078,-81.2214,WGS84,314,Cell #Q40,"17N 2865313 E, 477963 N",UTM,WGS84,1,325,272,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2004-03-30,BICY,391,NA,26.1527,-80.8913,26.1549,-80.891,WGS84,314,Cell #AX13,"17N 2892602 E, 510865 N",UTM,WGS84,1,10,391,species,A,A,A +Rhexia mariana,"Pale meadowbeauty, Maryland meadowbeauty",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhexmari,Human Observation,2003-05-03,BICY,652,NA,26.2534,-81.2022,26.2518,-81.2006,WGS84,314,Cell #S02,"17N 2903766 E, 479805 N",UTM,WGS84,1,145,652,species,A,A,A +Centella asiatica,"Coinwort, Spadeleaf",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,centasia,Human Observation,2002-05-31,BICY,129,NA,26.2159,-81.0498,26.2163,-81.0475,WGS84,314,"Cell #AIO6, Kissimmee Billy Area","17N 2899596 E, 495029 N",UTM,WGS84,1,80,129,species,A,A,A +Hydrocotyle,NA,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hydrocotyle sp.,Human Observation,2003-04-29,BICY,734,NA,25.8842,-81.2758,25.8822,-81.2749,WGS84,314,Cell #L43,"17N 2862884 E, 472375 N",UTM,WGS84,1,170,734,genus,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2004-05-04,BICY,343,NA,25.863,-81.1021,25.8608,-81.1019,WGS84,314,Cell #AC45,"17N 2860512 E, 489770 N",UTM,WGS84,1,100,343,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Setaria parviflora,"Knotroot foxtail, Yellow bristlegrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,setaparv,Human Observation,2004-05-13,BICY,429,NA,25.8978,-81.2753,25.9001,-81.2749,WGS84,314,Cell #L41,"17N 2864400 E, 472424 N",UTM,WGS84,1,10,429,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-02-05,BICY,468,NA,26.1795,-80.9405,26.1775,-80.9416,WGS84,314,Cell #AS10,"17N 2895569 E, 505946 N",UTM,WGS84,1,210,468,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-07-02,BICY,707,NA,25.6812,-80.9505,25.6827,-80.9524,WGS84,314,Cell #AR65,"17N 2840382 E, 504964 N",UTM,WGS84,1,315,707,species,A,A,A +Ludwigia repens,Creeping primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwrepe,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2002-09-18,BICY,233,NA,25.7252,-81.0306,25.7256,-81.033,WGS84,314,Cell #AJ60,"17N 2845250 E, 496927 N",UTM,WGS84,1,290,233,species,A,A,A +Tillandsia paucifolia,"Twisted wild-pine, Potbelly airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillpauc,Human Observation,2003-04-10,BICY,669,NA,26.0691,-81.1605,26.0687,-81.1629,WGS84,314,Cell #W22,"17N 2883351 E, 483950 N",UTM,WGS84,1,265,669,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2003-04-08,BICY,671,NA,26.0603,-81.165,26.0584,-81.1662,WGS84,314,Cell #W23,"17N 2882371 E, 483496 N",UTM,WGS84,1,210,671,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Agalinis linifolia,Flaxleaf false foxglove,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,agallini,Human Observation,2003-03-25,BICY,690,NA,25.935,-80.9886,25.9338,-80.9864,WGS84,314,Cell #AO37,"17N 2868490 E, 501141 N",UTM,WGS84,1,125,690,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2002-09-17,BICY,196,NA,25.7085,-80.9687,25.7096,-80.9668,WGS84,314,Cell #AQ62,"17N 2843408 E, 503144 N",UTM,WGS84,1,135,196,species,A,A,A +Ipomoea sagittata,Everglades morningglory,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ipomsagi,Human Observation,2002-08-28,BICY,228,NA,26.0141,-80.8956,26.0134,-80.8981,WGS84,314,Cell #AX28,"17N 2877249 E, 510444 N",UTM,WGS84,1,260,228,species,A,A,A +Annona glabra,Pond-apple,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,annoglab,Human Observation,2004-04-15,BICY,386,NA,26.2539,-81.0377,26.2524,-81.0396,WGS84,314,Cell #AJ02,"17N 2903800 E, 496238 N",UTM,WGS84,1,235,386,species,A,A,A +Coreopsis leavenworthii,Leavenworth's tickseed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,coreleav,Human Observation,2003-03-25,BICY,618,NA,25.944,-80.9871,25.946,-80.9862,WGS84,314,Cell #AO36,"17N 2869481 E, 501294 N",UTM,WGS84,1,20,618,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2002-10-31,BICY,274,NA,25.9152,-81.2644,25.9163,-81.2664,WGS84,314,Cell #M39,"17N 2866314 E, 473518 N",UTM,WGS84,1,305,274,species,A,A,A +Pleopeltis polypodioides var. michauxiana,Resurrection fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pleopolymich,Human Observation,2003-03-14,BICY,552,NA,26.2265,-81.2674,26.2243,-81.2672,WGS84,314,Cell #M05,"17N 2900793 E, 473289 N",UTM,WGS84,1,180,552,species,A,A,A +Andropogon glomeratus var. pumilus,Common bushy bluestem,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,andrglompumi,Human Observation,2004-06-17,BICY,333,NA,25.8815,-81.1742,25.8816,-81.1766,WGS84,314,Cell #V43,"17N 2862570 E, 482551 N",UTM,WGS84,1,260,333,species,A,A,A +Leersia hexandra,Southern cutgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,leerhexa,Human Observation,2003-03-06,BICY,555,NA,26.2322,-81.3052,26.2299,-81.3059,WGS84,314,Cell #I04,"17N 2901439 E, 469519 N",UTM,WGS84,1,205,555,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2002-08-23,BICY,236,NA,25.8448,-81.2201,25.8471,-81.2204,WGS84,314,Cell #Q47,"17N 2858519 E, 477943 N",UTM,WGS84,1,0,236,species,A,A,A +Ludwigia microcarpa,Smallfruit primrosewillow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,ludwmicr,Human Observation,2002-08-02,BICY,199,NA,25.8494,-80.995,25.8502,-80.9974,WGS84,314,Cell #AN46,"17N 2859003 E, 500497 N",UTM,WGS84,1,295,199,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2002-10-29,BICY,290,NA,26.1255,-81.2857,26.1276,-81.2851,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,25,290,species,A,A,A +Conoclinium coelestinum,Blue mistflower,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,conocoel,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Panicum virgatum,Switchgrass,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panivirg,Human Observation,2003-04-04,BICY,678,NA,26.079,-81.098,26.0769,-81.097,WGS84,314,Cell #AD21,"17N 2884432 E, 490194 N",UTM,WGS84,1,165,678,species,A,A,A +Eupatorium mikanioides,"Semaphore eupatorium, Semaphore thoroughwort",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,eupamika,Human Observation,2002-10-29,BICY,291,NA,26.1255,-81.2857,26.1233,-81.2869,WGS84,314,Cell #K16,"17N 2889619 E, 471434 N",UTM,WGS84,1,210,291,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-02-26,BICY,590,NA,26.045,-81.1655,26.0428,-81.1655,WGS84,314,Cell #W25,"17N 2880675 E, 483442 N",UTM,WGS84,1,190,590,species,A,A,A +Baccharis glomeruliflora,Silverling,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,baccglom,Human Observation,2003-05-02,BICY,512,NA,26.1068,-81.3197,26.1068,-81.3174,WGS84,314,Cell #H18,"17N 2887550 E, 468039 N",UTM,WGS84,1,100,512,species,A,A,A +Thelypteris kunthii,Southern shield fern,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,thelkunt,Human Observation,2002-08-09,BICY,261,NA,26.1786,-81.0048,26.1769,-81.0032,WGS84,314,Cell #AM10,"17N 2895459 E, 499518 N",UTM,WGS84,1,145,261,species,A,A,A +Pennisetum purpureum,"Napier grass, Elephantgrass",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,pennpurp,Human Observation,2002-11-08,BICY,288,NA,25.748,-80.9377,25.75,-80.9372,WGS84,314,Cell #AT58,"17N 2847783 E, 506247 N",UTM,WGS84,1,20,288,species,A,A,A +Flaveria linearis,Narrowleaf yellowtops,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,flavline,Human Observation,2004-06-03,BICY,352,NA,26.0243,-81.0653,26.0258,-81.067,WGS84,314,Cell #AG27,"17N 2878374 E, 493467 N",UTM,WGS84,1,335,352,species,A,A,A +Proserpinaca palustris,"Mermaid weed, Marsh mermaidweed",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,prospalu,Human Observation,2004-04-14,BICY,421,NA,26.2176,-81.0845,26.219,-81.0864,WGS84,314,Cell #AE06,"17N 2899785 E, 491558 N",UTM,WGS84,1,310,421,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2003-03-26,BICY,693,NA,25.6592,-81.0263,25.6585,-81.024,WGS84,314,Cell #AK68,"17N 2837939 E, 497357 N",UTM,WGS84,1,110,693,species,A,A,A +Salix caroliniana,Coastal Plain willow,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,salicaro,Human Observation,2002-08-01,BICY,254,NA,26.1693,-81.2554,26.1694,-81.2578,WGS84,314,Cell #N11,"17N 2894454 E, 474478 N",UTM,WGS84,1,280,254,species,A,A,A +Rhynchospora microcarpa,Southern beaksedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,rhynmicr2,Human Observation,2004-03-17,BICY,378,NA,26.186,-81.343,26.1854,-81.3406,WGS84,314,Cell #E09,"17N 2896326 E, 465728 N",UTM,WGS84,1,110,378,species,A,A,A +Harrisella porrecta,Needleroot airplant orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,harrporr,Human Observation,2003-04-16,BICY,660,NA,26.2547,-81.0622,26.2528,-81.0628,WGS84,314,Cell #AG02,"17N 2903897 E, 493787 N",UTM,WGS84,1,200,660,species,A,A,A +Sabal palmetto,Cabbage palm,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,sabapalm,Human Observation,2004-06-02,BICY,355,NA,26.007,-81.0699,26.0092,-81.0692,WGS84,314,Cell #AG29,"17N 2876456 E, 493009 N",UTM,WGS84,1,30,355,species,A,A,A +Eryngium baldwinii,Baldwin's eryngo,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,erynbald,Human Observation,2004-05-05,BICY,328,NA,26.2408,-81.0341,26.243,-81.0343,WGS84,314,Cell #AJ03,"17N 2902357 E, 496596 N",UTM,WGS84,1,0,328,species,A,A,A +Epidendrum rigidum,Stiff-flower star orchid,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,epidrigi,Human Observation,2004-04-29,BICY,404,NA,25.8211,-81.0303,25.8192,-81.0318,WGS84,314,Cell #AJ50,"17N 2855868 E, 496959 N",UTM,WGS84,1,220,404,species,A,A,A +Myrica cerifera,"Wax myrtle, Southern Bayberry",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,myriceri,Human Observation,2004-06-16,BICY,335,NA,26.2329,-81.0986,26.2331,-81.0962,WGS84,314,Cell #AD04,"17N 2901479 E, 490153 N",UTM,WGS84,1,90,335,species,A,A,A +Fuirena breviseta,Saltmarsh umbrellasedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,fuirbrev,Human Observation,2003-03-04,BICY,560,NA,26.0296,-81.0943,26.0296,-81.0918,WGS84,314,Cell #AD27,"17N 2878960 E, 490566 N",UTM,WGS84,1,90,560,species,A,A,A +Smilax laurifolia,"Catbrier, Laurel greenbrier, Bamboo vine",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,smillaur,Human Observation,2003-09-10,BICY,727,NA,26.2131,-81.3056,26.2133,-81.3069,WGS84,314,Cell #I06,"17N 2899315 E, 469471 N",UTM,WGS84,1,240,727,species,A,A,A +Vitis rotundifolia,"Muscadine, Muscadine grape",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,vitirotu,Human Observation,2003-03-05,BICY,568,NA,26.0167,-81.1132,26.0165,-81.1107,WGS84,314,Cell #AB28,"17N 2877539 E, 488676 N",UTM,WGS84,1,95,568,species,A,A,A +Hypericum tetrapetalum,Fourpetal St. John's-wort,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,hypetetr,Human Observation,2004-03-24,BICY,411,NA,26.22,-81.0859,26.2213,-81.0839,WGS84,314,Cell #AE05,"17N 2900049 E, 491423 N",UTM,WGS84,1,30,411,species,A,A,A +Pluchea rosea,Rosy camphorweed,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,plucrose,Human Observation,2003-03-18,BICY,617,NA,25.9166,-81.1158,25.9143,-81.1156,WGS84,314,Cell #AB39,"17N 2866448 E, 488404 N",UTM,WGS84,1,185,617,species,A,A,A +Aristida purpurascens,Arrowfeather threeawn,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,arispurp,Human Observation,2003-02-21,BICY,452,NA,26.0064,-80.9098,26.0048,-80.908,WGS84,314,Cell #AW29,"17N 2876396 E, 509026 N",UTM,WGS84,1,140,452,species,A,A,A +Cyperus haspan,Haspan flatsedge,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,cypehasp,Human Observation,2002-10-31,BICY,276,NA,25.8982,-81.257,25.8975,-81.255,WGS84,314,Cell #N41,"17N 2864436 E, 474256 N",UTM,WGS84,1,110,276,species,A,A,A +Bacopa caroliniana,"Lemon hyssop, Lemon bacopa, Blue waterhyssop",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,bacocaro,Human Observation,2003-05-15,BICY,643,NA,25.9071,-81.3325,25.9056,-81.3342,WGS84,314,Cell #F40,"17N 2865443 E, 466694 N",UTM,WGS84,1,230,643,species,A,A,A +Tillandsia fasciculata var. densispica,"Stiff-leaved wild-pine, Cardinal airplant",Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,tillfascdens,Human Observation,2002-08-29,BICY,251,NA,25.784300000000002,-81.0757,25.7827,-81.0774,WGS84,314,Cell #AF54,"17N 2851797 E, 492406 N",UTM,WGS84,1,230,251,species,A,A,A +Panicum rigidulum,Redtop panicum,Guide to the Vascular Plants of Florida. Second Edition. Richard P. Wunderlin and Bruce F. Hansen. 2003. University Press of Florida,panirigi,Human Observation,2002-05-22,BICY,213,NA,25.7595,-81.0428,25.7604,-81.0449,WGS84,314,Cell #AI56,"17N 2849056 E, 495705 N",UTM,WGS84,1,280,213,species,A,A,A diff --git a/inst/extdata/BUIS_herps/BUIS_herps.csv b/inst/extdata/BUIS_herps/BUIS_herps.csv new file mode 100644 index 0000000..daf92ae --- /dev/null +++ b/inst/extdata/BUIS_herps/BUIS_herps.csv @@ -0,0 +1,47 @@ +eventDate,eventDate_flag,lifeStage,sex,locality,recordedBy,verbatimCoordinateSystem,geodeticDatum,decimalLatitude,decimalLongitude,verbatimCoordinates,Point_ID,coordinateUncertaintyInMeters,coordinate_flag,catalogNumber,samplingProtocol,occurrenceRemarks,order,family,genus,specificEpithet,infraspecificEpithet,vernacularName,scientificName,scientificName_flag,establishmentMeans,eventRemarks,custom_SpeciesCode,custom_CaptureID,custom_SnoutToVentLengthInMm,custom_Substrate,custom_Collected,custom_SpecimenID,custom_CollectionDate,custom_SacrificeDate,custom_Fixative,custom_Preservative +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3396,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,2,16,NA,1,9,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3398,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,3,26,NA,1,11,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3397,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,4,20,NA,1,10,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789304107479747,-82.6232285973053,E 327939 N 1967620,3,20,A,BUIS 3393,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,5,27,NA,1,6,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78820833617135,-82.62134174481531,E 328138 N 1967497,5,20,A,BUIS 3395,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,6,24,NA,1,8,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790153112468364,-82.62653747081812,E 327589 N 1967717,4,20,A,BUIS 3394,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,7,20,NA,1,7,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3391,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,8,27,NA,1,4,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3388,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,9,17,NA,1,1,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3389,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,10,25,NA,1,2,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Juvenile,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786762548247353,-82.6213475589926,E 328136 N 1967337,2,20,A,BUIS 3392,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,11,14,NA,1,5,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3390,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,NA,Sbe,12,26,NA,1,3,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3414,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,13,58,NA,1,27,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3411,Opportunistic Encounter Survey,Right hind foot broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,14,46,NA,1,24,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3412,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,15,43,NA,1,25,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.790396960412846,-82.62546443005819,E 327703 N 1967743,1,20,A,BUIS 3413,Opportunistic Encounter Survey,Tail broken off.,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,16,49,NA,1,26,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3410,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,17,52,NA,1,23,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.78960300829916,-82.62205230098505,E 328064 N 1967652,13,20,A,BUIS 3409,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,18,59,NA,1,22,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.787949020721694,-82.62210338788441,E 328057 N 1967469,9,20,A,BUIS 3403,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,19,54,NA,1,16,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.789456323873306,-82.62774788298215,E 327460 N 1967641,12,20,A,BUIS 3408,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,20,63,NA,1,21,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3402,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,21,43,NA,1,15,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3407,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,22,44,NA,1,20,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786538308764356,-82.62114746679222,E 328157 N 1967312,8,20,A,BUIS 3401,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,23,46,NA,1,14,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3404,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,24,45,NA,1,17,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-06-20,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.788179225226738,-82.6204926098992,E 328228 N 1967493,11,20,A,BUIS 3406,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,25,56,NA,1,19,2001-06-20,2001-06-21,Formalin (10%),Ethanol (70%) +2001-10-18,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.786096574974277,-82.62429370051896,E 327823 N 1967266,10,20,A,BUIS 3405,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,26,62,NA,1,18,2001-10-18,2001-10-19,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.785244256880826,-82.62355974989633,E 327900 N 1967171,6,20,A,BUIS 3399,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,27,50,NA,1,12,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Adult,Undetermined,"Buck Island, St. Croix, U.S. Virgin Islands",J. Hardin Waddle,UTM,WGS84,17.784889496549056,-82.62275484678544,E 327985 N 1967131,7,20,A,BUIS 3400,Opportunistic Encounter Survey,Collected from wooden stake along beach.,Squamata/Sauria,Gekkonidae,Hemidactylus,mabouia,NA,tropical house gecko,Hemidactylus mabouia,A,Introduced,NA,Hma,28,54,NA,1,13,2001-10-17,2001-10-20,Formalin (10%),Ethanol (70%) +2001-10-17,A,Juvenile,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,29,23,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,30,61,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,31,52,Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,32,47,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,33,46,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,34,56,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,35,47,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,36,44,Tamarind Tree,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,37,45,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Female,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,38,47,Acacia,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,39,48,Grass,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,40,62,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,41,50,Shrub,0,28,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under wood litter,Sbe,42,31,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,43,29,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Gekkonidae,Sphaerodactylus,beattyi,beattyi,cotton ginner dwarf gecko,Sphaerodactylus beattyi beattyi,A,Native,Under rock,Sbe,44,32,Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,45,60,Tree,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Male,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,46,57,Bare Ground,0,29,NA,NA,NA,NA +2001-10-17,A,Adult,Undetermined,NA,NA,UTM,WGS84,NA,NA,NA,"NA",20,R,NA,Opportunistic Encounter Survey,NA,Squamata/Sauria,Polychrotidae,Anolis,acutus,NA,St. Croix anole,Anolis acutus,A,Native,NA,Aac,47,63,Tree Leaf,0,29,NA,NA,NA,NA diff --git a/inst/extdata/BUIS_herps/BUIS_herps_EMLeditor_metadata.xml b/inst/extdata/BUIS_herps/BUIS_herps_EMLeditor_metadata.xml new file mode 100644 index 0000000..0db4556 --- /dev/null +++ b/inst/extdata/BUIS_herps/BUIS_herps_EMLeditor_metadata.xml @@ -0,0 +1,1040 @@ + + + + doi: https://doi.org/10.57830/2295037 + Buck Island Reef National Monument Herpetofauna Inventories + + + Amelia + G + Sherman + + NPS + amelia_sherman@partner.nps.gov + + + BUIS + + + SFCN + + + + Robert + L + Baker + + NPS + Rob_Baker@nps.gov + contributor + + 2022-11-15 + eng + + DUring the year of 2001, a herpetofaunal inventory was conducted at Buck Island (BUIS) off the coast of Florida in an effort to try to find and record a comprehensive list of the species found within the parks. To achieve this goal an opportunistic encounter survey was conducted. In an effort to comply with Executive Order 13642, Making Open and Machine Readable the New Default for Government Information (GPO 2013), almost 20 years after this inventory project ended, the numerous datasets created as a result of the study were cleaned and processed in order to become machine readable and accessible to the public. + + + BUIS + Buck Island + SFCN + herps + herpetofauna + + + lizards + reptiles + LTER Controlled Vocabulary + + + Waddle JH and Others. 2002. Herpetological Inventory of Buck Island Reef National Monument&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2175750 + Sherman AG. 2022. Buck Island Reef National Monument (BUIS) Herpetofauna Inventory Raw Datasets&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295035 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Machine Readable Inventory&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295037 + Sherman A. 2022. Buck Island Reef National Monument Herpetofauna Inventory Cleanup Script&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295038 + Sherman A. Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR)&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Project. 2022&#13; +https://irma.nps.gov/DataStore/Reference/Profile/2295040&#13; + + + + This data package is released to the "public domain" under Creative Commons CC0 1.0 "No Rights Reserved" (see: https://creativecommons.org/publicdomain/zero/1.0/). It is considered professional etiquette to provide attribution of the original work if this data package is shared in whole or by individual components. A generic citation is provided for this data package on the website https://portal.edirepository.org (herein "website") in the summary metadata page. Communication (and collaboration) with the creators of this data package is recommended to prevent duplicate research or publication. This data package (and its components) is made available "as is" and with no warranty of accuracy or fitness for use. The creators of this data package and the website shall not be liable for any damages resulting from misinterpretation or misuse of the data package or its components. Periodic updates of this data package may be available from the website. Thank you. + + + + + 2 + + -82.6213475589926 + -82.6213475589926 + 17.7867625482474 + 17.7867625482474 + + + + 1 + + -82.6254644300582 + -82.6254644300582 + 17.7903969604128 + 17.7903969604128 + + + + 3 + + -82.6232285973053 + -82.6232285973053 + 17.7893041074797 + 17.7893041074797 + + + + 5 + + -82.6213417448153 + -82.6213417448153 + 17.7882083361714 + 17.7882083361714 + + + + 4 + + -82.6265374708181 + -82.6265374708181 + 17.7901531124684 + 17.7901531124684 + + + + 13 + + -82.622052300985 + -82.622052300985 + 17.7896030082992 + 17.7896030082992 + + + + 9 + + -82.6221033878844 + -82.6221033878844 + 17.7879490207217 + 17.7879490207217 + + + + 12 + + -82.6277478829821 + -82.6277478829821 + 17.7894563238733 + 17.7894563238733 + + + + 8 + + -82.6211474667922 + -82.6211474667922 + 17.7865383087644 + 17.7865383087644 + + + + 11 + + -82.6204926098992 + -82.6204926098992 + 17.7881792252267 + 17.7881792252267 + + + + 10 + + -82.624293700519 + -82.624293700519 + 17.7860965749743 + 17.7860965749743 + + + + 6 + + -82.6235597498963 + -82.6235597498963 + 17.7852442568808 + 17.7852442568808 + + + + 7 + + -82.6227548467854 + -82.6227548467854 + 17.7848894965491 + 17.7848894965491 + + + + + + 2001-06-20 + + + 2001-10-20 + + + + + + kingdom + Animalia + 1 + + phylum + Chordata + 44 + + class + Reptilia + 358 + + order + Squamata + 715 + + family + Sphaerodactylidae + 5789478 + + genus + Sphaerodactylus + 8827334 + + species + Sphaerodactylus beattyi + 2445373 + + subspecies + Sphaerodactylus beattyi beattyi + 7190852 + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Iguania + Iguanas + 564529 + + family + Dactyloidae + 1055379 + + genus + Anolis + Anoles + Western Antillean Anoles + 173883 + + species + Anolis acutus + St. Croix Anole + Sharp Anole + Saint Croix's Anole + 173884 + + + + + + + + + + + + + + + kingdom + Animalia + animals + 202423 + + subkingdom + Bilateria + 914154 + + infrakingdom + Deuterostomia + 914156 + + phylum + Chordata + chordates + 158852 + + subphylum + Vertebrata + vertebrates + 331030 + + infraphylum + Gnathostomata + 914179 + + superclass + Tetrapoda + 914181 + + class + Reptilia + Reptiles + 173747 + + order + Squamata + Amphisbaenians + Lizards + Snakes + 173861 + + suborder + Gekkota + 564528 + + family + Gekkonidae + Geckos + 174034 + + genus + Hemidactylus + House Geckos + Half-toed Geckos + 174054 + + species + Hemidactylus mabouia + Cosmopolitan House Gecko + Afro-American House Gecko + Afroamerican house gecko + Wood Slave + 174058 + + + + + + + + + + + + + + + + + complete + + + + Judd + Patterson + + NPS + Judd_Patterson@nps.gov + + + National Park Service +
+ 1201 Oakridge Drive, Suite 150 + Fort Collins + CO + 80525 + USA +
+ irma@nps.gov + http://www.nps.gov + https://ror.org/044zqqy65 +
+ + + + Original Inventory Surveys + Amphibians and reptiles were surveyed at BUIS twice in the year 2001. The first survey occurred from 20 June 2001 to 21 June 2001. During this survey five observers combed the island searching for any signs of amphibians and reptiles. All habitats on the island were searched. Leaf litter was sifted through, logs and rocks were turned, the axils of bromeliads were searched, and the branches of trees and shrubs were scanned. A day and a night survey was conducted on 20 June 2001, and another day survey was conducted on 21 June 2001. It was noted at this time that the island was extremely dry, and no moisture was found under the leaf litter or in refugia such as bromeliad phytotelmata. + The second survey occurred from 17 October 2001 to 18 October 2001. Searches&#13; +were conducted during both day and night on both of these days. The survey conducted was similar to the one before, again using as many as five observers at one time to search. This survey occurred directly after a significant rainfall on the island, and found moist refugia and water in bromeliad axils. + Data Processing + The original raw datasets were being stored in an access database, and were exported into a csv format. All of the data processing was done using R. All data containing coordinates were converted from UTM to decimal latitude and longitude. The datasets are formatted in a way that is more legible and digestible for data comprehension. Columns with letter or number codes were translated and consistent columns (ie. coordinate system, geodetic datum, sampling protocol, etc.) were added. Data quality processing and flags were created. The scientific name column was created based off the species list data. All like tables were merged/joined together and the final columns were selected and named to Darwin Core standards (TDWG 2021). A threatened and endangered species function was used to check that no sensitive species were present in the datasets. None were found for this inventory.&#13; + + + + + + BUIS_herps + All the data collected for the Buck Island herpetofauna inventory from 2001 + + BUIS_herps.csv + 15701 + ed3c6bcc251ef21f45ace46d4ae09e70 + + + 1 + \n + column + + , + + + + + + https://irma.nps.gov/DataStore/Reference/Profile/2294549 + + + + + + eventDate + The date on which the animal was captured. + date + + + YYYY-MM-DD + + + + + eventDate_flag + A DQ flag column for the date. + string + + + + + A DQ flag column for the date. + + + + + + + lifeStage + The age class of the animal. + string + + + + + The age class of the animal. + + + + + + + sex + The gender of the animal if it can be determined. + string + + + + + The gender of the animal if it can be determined. + + + + + + + locality + A description of location where specimen was collected + string + + + + + A description of location where specimen was collected + + + + + + + recordedBy + Name of person who collected specimen + string + + + + + Name of person who collected specimen + + + + + + + verbatimCoordinateSystem + The original coordinate system the coordinates were recorded in. + string + + + + + The original coordinate system the coordinates were recorded in. + + + + + + + geodeticDatum + The geodetic datum of the coordinates. + string + + + + + The geodetic datum of the coordinates. + + + + + + + decimalLatitude + The latitude of the collection spot + float + + + + degree + + + real + + 17.7848894965491 + 17.7903969604128 + + + + + + + decimalLongitude + the longitude of the collection spot + float + + + + degree + + + real + + -82.6277478829821 + -82.6204926098992 + + + + + + + verbatimCoordinates + The original coordinates recorded. + string + + + + + The original coordinates recorded. + + + + + + + Point_ID + The name of the plot site. + string + + + + + The name of the plot site. + + + + + + + coordinateUncertaintyInMeters + The amount of uncertainty in meters of the coordiante points recorded. + float + + + + dimensionless + + + natural + + 20 + 20 + + + + + + + coordinate_flag + A DQ flag column for the coordinates. + string + + + + + A DQ flag column for the coordinates. + + + + + + + catalogNumber + The catalog number for the NPS's ANCS+ database + string + + + + + The catalog number for the NPS's ANCS+ database + + + + + + + samplingProtocol + The type of survey method used to sample the area. + string + + + + + The type of survey method used to sample the area. + + + + + + + occurrenceRemarks + Any notes about the individual animal + string + + + + + Any notes about the individual animal + + + + + + + order + The taxonomic order to which the species belongs + string + + + + + The taxonomic order to which the species belongs + + + + + + + family + The taxonomic family to which the species belongs + string + + + + + The taxonomic family to which the species belongs + + + + + + + genus + The generic name of the species. + string + + + + + The generic name of the species. + + + + + + + specificEpithet + The specific epithet of the species + string + + + + + The specific epithet of the species + + + + + + + infraspecificEpithet + The subspecific designation of a species if applicable. + string + + + + + The subspecific designation of a species if applicable. + + + + + + + vernacularName + The common name for the species. + string + + + + + The common name for the species. + + + + + + + scientificName + The full scientific name of the species. + string + + + + + The full scientific name of the species. + + + + + + + scientificName_flag + A DQ flag column for the species recorded + string + + + + + A DQ flag column for the species recorded + + + + + + + establishmentMeans + Whether or not the species is native to the area or not. + string + + + + + Whether or not the species is native to the area or not. + + + + + + + eventRemarks + notes from the capture + string + + + + + notes from the capture + + + + + + + custom_SpeciesCode + The three-letter code for the species + string + + + + + The three-letter code for the species + + + + + + + custom_CaptureID + The primary key field, each capture gets a unique autonumber assigned by Access + float + + + + dimensionless + + + natural + + 2 + 47 + + + + + + + custom_SnoutToVentLengthInMm + The snout-to-vent length of the animal in mm. + float + + + + millimeter + + + natural + + 14 + 63 + + + + + + + custom_Substrate + The substrate on which the animal was observed prior to capture. + string + + + + + The substrate on which the animal was observed prior to capture. + + + + + + + custom_Collected + Whether or not it was collected + float + + + + dimensionless + + + whole + + 0 + 1 + + + + + + + custom_SpecimenID + The specimen ID field + float + + + + dimensionless + + + natural + + 1 + 29 + + + + + + + custom_CollectionDate + Date specimen was collected + date + + + YYYY-MM-DD + + + + + custom_SacrificeDate + Date Specimen was sacrificed and preserved + date + + + YYYY-MM-DD + + + + + custom_Fixative + Description of fixative solution used + string + + + + + Description of fixative solution used + + + + + + + custom_Preservative + Description of preservative solution used + string + + + + + Description of preservative solution used + + + + + + + 46 + + + DRR: https://doi.org/10.36967/2295039 + Buck Island Reef National Monument Herpetofauna Inventory Data Release Report (DRR) + + NPS + + + 2295039 + + +
+ + + PUBFUL + + + + + + EMLassemblyline + 3.5.5 + + + + + + + NPS + TRUE + + + + + + + EMLeditor + 0.0.1.1 + + + +
diff --git a/inst/extdata/README.txt b/inst/extdata/README.txt new file mode 100644 index 0000000..9d0be70 --- /dev/null +++ b/inst/extdata/README.txt @@ -0,0 +1 @@ +WARNING: All datasets in this folder were created and modified for the sole purpose of testing and examples. Do not use these datasets for scientific purposes. \ No newline at end of file diff --git a/man/DPchecker_example.Rd b/man/DPchecker_example.Rd new file mode 100644 index 0000000..3c5245c --- /dev/null +++ b/man/DPchecker_example.Rd @@ -0,0 +1,21 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tabular_data_congruence.R +\name{DPchecker_example} +\alias{DPchecker_example} +\title{Generate path to example data} +\usage{ +DPchecker_example(dp_name = NULL) +} +\arguments{ +\item{dp_name}{Name of data package. If omitted, this function will list all available example data packages.} +} +\value{ +Path to example data, if dp_name is specified, or all available example data if not. +} +\description{ +Generate path to example data +} +\examples{ +DPchecker_example() +DPchecker_example("BUIS_herps") +} diff --git a/man/load_data.Rd b/man/load_data.Rd index 347cf7c..02b85b3 100644 --- a/man/load_data.Rd +++ b/man/load_data.Rd @@ -19,5 +19,6 @@ load_data inspects the working directory for data files. Loads all existing data loads all data files in a specified directory (default is the working directory) into a tibble for later use in congruence checking. Returns the user to the working directory upon exit. Currently only supports .csv files. } \examples{ -my_data <- load_data() +data_pkg_dir <- DPchecker_example("BICY_veg") +my_data <- load_data(data_pkg_dir) } diff --git a/man/load_metadata.Rd b/man/load_metadata.Rd index 2385671..5533b58 100644 --- a/man/load_metadata.Rd +++ b/man/load_metadata.Rd @@ -21,6 +21,7 @@ load_metadata loads the metadata file from a given path or directory. given a path or directory - default is the working directory - load_metadata looks for files with the ending *_metadata.xml. The function quits and warns the user if no such files are found or if more than one such file is found. If only one metadata file is found, it checked for one of 3 formats: FGDC, ISO, or EML. Currently only EML is supported and the function will warn the user and quit if non-EML metadata is found. The EML metadata file is loaded into R's work space for future use during congruence checking. } \examples{ -my_metadata <- load_metadata() +data_pkg_dir <- DPchecker_example("BICY_veg") +my_metadata <- load_metadata(data_pkg_dir) } diff --git a/man/test_date_range.Rd b/man/test_date_range.Rd index 305edf7..cabc534 100644 --- a/man/test_date_range.Rd +++ b/man/test_date_range.Rd @@ -21,5 +21,6 @@ test_date_range verifies that dates in the dataset are consistent with the date This function checks columns that are identified as date/time in the metadata. It throws a warning if the dates contained in the columns are outside of the temporal coverage specified in the metadata. If the date/time format string specified in the metadata does not match the actual format of the date in the CSV, it will likely fail to parse and throw an error. } \examples{ -test_date_range() +dir <- DPchecker_example("BICY_veg") +test_date_range(dir) } diff --git a/man/test_delimiter.Rd b/man/test_delimiter.Rd index 1c506c0..350734b 100644 --- a/man/test_delimiter.Rd +++ b/man/test_delimiter.Rd @@ -19,5 +19,6 @@ test_delimiter checks the metadata file and ensures that each data file has a fi test_delimiter examines the fieldDelimiter element from EML (currently only EML is supported) metadata to determine how many characters there are. If there is no fieldDelimiter element, the test returns an error. If the field delimiter is anything other than exactly one character in length, the test returns an error. } \examples{ -test_delimiter() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_delimiter(meta) } diff --git a/man/test_dup_meta_entries.Rd b/man/test_dup_meta_entries.Rd index 871fea6..5c28d48 100644 --- a/man/test_dup_meta_entries.Rd +++ b/man/test_dup_meta_entries.Rd @@ -19,5 +19,6 @@ test_dup_meta_entries test to see whether there are duplicate filenames listed f specifically, test_dup_meta_entries looks at the 'physical' elements of a metadata file, which describe each data file, and asks whether there are duplicates entries under the objectName child element, which is where the file name for each data file is stored. } \examples{ -test_dup_meta_entries() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_dup_meta_entries(meta) } diff --git a/man/test_fields_match.Rd b/man/test_fields_match.Rd index aaf105a..c0a484c 100644 --- a/man/test_fields_match.Rd +++ b/man/test_fields_match.Rd @@ -24,5 +24,6 @@ test_fields_match compares the attributes of each dataTable within the EML metad test_fields_match briefly checks that data files match, but you should really run \code{test_file_name_match()} before you run this test. } \examples{ -test_fields_match() +dir <- DPchecker_example("BICY_veg") +test_fields_match(dir) } diff --git a/man/test_file_name_match.Rd b/man/test_file_name_match.Rd index 6e86864..ac4b52a 100644 --- a/man/test_file_name_match.Rd +++ b/man/test_file_name_match.Rd @@ -24,5 +24,6 @@ test_file_name_match checks to see whether all data files (.csv) within a specif If a directory other than the current working directory is specified, test.fileNameMatch returns to the current working directory on exit. Note that the metadata file must follow NPS naming conventions, specifically ending in *_metadata.xml. test.fileNameMatch assumes there are the same number of data files in the directory as dataTables in the metadata file. } \examples{ -test_file_name_match() +dir <- DPchecker_example("BICY_veg") +test_file_name_match(dir) } diff --git a/man/test_footer.Rd b/man/test_footer.Rd index ba98f4d..ffc1fd3 100644 --- a/man/test_footer.Rd +++ b/man/test_footer.Rd @@ -19,5 +19,6 @@ test_footer checks the metadata files to determine whether data files contain fo If footer lines are not present, the data package passes the test. If footer lines are present, the data package fails the test and the user is instructed to remove footer lines prior to data package upload. Currently only EML metadata are supported. } \examples{ -test_footer() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_footer(meta) } diff --git a/man/test_header_num.Rd b/man/test_header_num.Rd index 1a71f40..5a803ae 100644 --- a/man/test_header_num.Rd +++ b/man/test_header_num.Rd @@ -19,5 +19,6 @@ test_header_num checks the metadata files to ensure that each data file contains test_header_num examines the numHeaderLines element from EML (currently only EML is supported) metadata to determine how many header rows there are. If there are no header rows or if there is more than one header row, the test fails. The test also fails if there is no information about the number of header rows. } \examples{ -test_header_num() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_header_num(meta) } diff --git a/man/test_metadata_version.Rd b/man/test_metadata_version.Rd index 908e1af..5694a2e 100644 --- a/man/test_metadata_version.Rd +++ b/man/test_metadata_version.Rd @@ -19,5 +19,6 @@ test_metadata_version determines whether the version of the metadata supplied me currently only EML is supported. EML must be version >= 2.2.0. } \examples{ -test_metadata_version() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_metadata_version(meta) } diff --git a/man/test_numeric_fields.Rd b/man/test_numeric_fields.Rd index 55f0011..85b3b17 100644 --- a/man/test_numeric_fields.Rd +++ b/man/test_numeric_fields.Rd @@ -24,5 +24,6 @@ test_numeric_fields verifies that all columns listed as numeric in the metadata "NA" and missing data codes documented in the metadata will \emph{not} cause this test to fail. Note that this test assumes that the column types that are in the metadata are the intended types, i.e., if your metadata says a column is text and it should actually be numeric, it will not be caught by this test. } \examples{ -test_numeric_fields() +dir <- DPchecker_example("BICY_veg") +test_numeric_fields(dir) } diff --git a/man/test_validate_schema.Rd b/man/test_validate_schema.Rd index a82b560..b246f2a 100644 --- a/man/test_validate_schema.Rd +++ b/man/test_validate_schema.Rd @@ -19,5 +19,6 @@ test_validate_schema inspects a metadata object loaded into R and determines whe currently, only EML is supported. For now this is just a wrapper form EML::eml_validate(). } \examples{ -test_validate_schema() +meta <- load_metadata(DPchecker_example("BICY_veg")) +test_validate_schema(meta) } diff --git a/run_all_tests.R b/run_all_tests.R deleted file mode 100644 index 8e2b521..0000000 --- a/run_all_tests.R +++ /dev/null @@ -1,26 +0,0 @@ -dirs <- list.dirs(here::here("scratchpad")) -dirs <- dirs[-1] # get rid of root dir -dirs <- dirs[grepl("(BICY)|(BUIS)", dirs)] # Just test with new BICY and BUIS datasets for now - -for (dir in dirs) { - cat(paste(crayon::blue$bold(basename(dir)), "\n")) - - meta <- try(load_metadata(dir)) - data <- try(load_data(dir)) - - if (!any("try-error" %in% class(meta))) { # Run tests unless metadata fails to load - try(test_validate_schema(meta)) - try(test_metadata_version(meta)) - try(test_delimiter(meta)) - try(test_footer(meta)) - try(test_header_num(meta)) - try(test_dup_data_files(dir)) - try(test_dup_meta_entries(meta)) - try(test_file_name_match(dir, meta)) - try(test_fields_match(dir, meta)) - try(test_numeric_fields(dir, meta)) - try(test_date_range(dir, meta)) - } - - cat("\n") -} From 978c8e1b3c5ccdc69e781730a300bdcd5669b4a2 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 12:41:24 -0700 Subject: [PATCH 45/60] Try github actions again, on current branch this time --- .Rbuildignore | 4 ++- .github/workflows/R-CMD-check.yaml | 2 +- .github/workflows/pkgdown.yaml | 2 +- .github/workflows/test-coverage.yaml | 50 ++++++++++++++++++++++++++++ .gitignore | 1 + DESCRIPTION | 2 +- README.md | 1 + _pkgdown.yml | 4 +++ codecov.yml | 14 -------- 9 files changed, 62 insertions(+), 18 deletions(-) create mode 100644 .github/workflows/test-coverage.yaml create mode 100644 _pkgdown.yml delete mode 100644 codecov.yml diff --git a/.Rbuildignore b/.Rbuildignore index b13ccae..1eb6bed 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -3,4 +3,6 @@ ^DPchecker\.Rproj$ ^LICENSE\.md$ ^\.github$ -^codecov\.yml$ +^_pkgdown\.yml$ +^docs$ +^pkgdown$ diff --git a/.github/workflows/R-CMD-check.yaml b/.github/workflows/R-CMD-check.yaml index a3ac618..5538a71 100644 --- a/.github/workflows/R-CMD-check.yaml +++ b/.github/workflows/R-CMD-check.yaml @@ -2,7 +2,7 @@ # Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help on: push: - branches: [main, master] + branches: [main, master, unit-testing] pull_request: branches: [main, master] diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml index 087f0b0..f79a44e 100644 --- a/.github/workflows/pkgdown.yaml +++ b/.github/workflows/pkgdown.yaml @@ -2,7 +2,7 @@ # Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help on: push: - branches: [main, master] + branches: [main, master, unit-testing] pull_request: branches: [main, master] release: diff --git a/.github/workflows/test-coverage.yaml b/.github/workflows/test-coverage.yaml new file mode 100644 index 0000000..1a2b8db --- /dev/null +++ b/.github/workflows/test-coverage.yaml @@ -0,0 +1,50 @@ +# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples +# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help +on: + push: + branches: [main, master, unit-testing] + pull_request: + branches: [main, master] + +name: test-coverage + +jobs: + test-coverage: + runs-on: ubuntu-latest + env: + GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} + + steps: + - uses: actions/checkout@v3 + + - uses: r-lib/actions/setup-r@v2 + with: + use-public-rspm: true + + - uses: r-lib/actions/setup-r-dependencies@v2 + with: + extra-packages: any::covr + needs: coverage + + - name: Test coverage + run: | + covr::codecov( + quiet = FALSE, + clean = FALSE, + install_path = file.path(Sys.getenv("RUNNER_TEMP"), "package") + ) + shell: Rscript {0} + + - name: Show testthat output + if: always() + run: | + ## -------------------------------------------------------------------- + find ${{ runner.temp }}/package -name 'testthat.Rout*' -exec cat '{}' \; || true + shell: bash + + - name: Upload test results + if: failure() + uses: actions/upload-artifact@v3 + with: + name: coverage-test-failures + path: ${{ runner.temp }}/package diff --git a/.gitignore b/.gitignore index 26b96c6..0e19d9b 100644 --- a/.gitignore +++ b/.gitignore @@ -3,3 +3,4 @@ .RData .Ruserdata scratchpad/* +docs diff --git a/DESCRIPTION b/DESCRIPTION index 7d0e3d1..25470b2 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -13,7 +13,6 @@ Encoding: UTF-8 Roxygen: list(markdown = TRUE) RoxygenNote: 7.2.1 Suggests: - covr, here, testthat (>= 3.0.0) Config/testthat/edition: 3 @@ -31,3 +30,4 @@ Imports: tibble Remotes: nationalparkservice/EMLeditor +URL: https://nationalparkservice.github.io/DPchecker/ diff --git a/README.md b/README.md index 4a36f6c..f125de8 100644 --- a/README.md +++ b/README.md @@ -6,6 +6,7 @@ [![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) +[![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) DPchecker (Data Package checker) is a package with a series of functions for NPS data package authors and reviewers to check for internal consistency among data/meta data and with the data package standards. diff --git a/_pkgdown.yml b/_pkgdown.yml new file mode 100644 index 0000000..dea6886 --- /dev/null +++ b/_pkgdown.yml @@ -0,0 +1,4 @@ +url: https://nationalparkservice.github.io/DPchecker/ +template: + bootstrap: 5 + diff --git a/codecov.yml b/codecov.yml deleted file mode 100644 index 04c5585..0000000 --- a/codecov.yml +++ /dev/null @@ -1,14 +0,0 @@ -comment: false - -coverage: - status: - project: - default: - target: auto - threshold: 1% - informational: true - patch: - default: - target: auto - threshold: 1% - informational: true From d0878441bce702d4ecd35cfd2f842f6653af2e16 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 13:34:17 -0700 Subject: [PATCH 46/60] Remove duplicate badge --- README.md | 1 - 1 file changed, 1 deletion(-) diff --git a/README.md b/README.md index f125de8..3c972d5 100644 --- a/README.md +++ b/README.md @@ -5,7 +5,6 @@ #### v0.0.0.9000 - [![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) [![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) From 0c47db824794bb9741ac745902325a3b28496b7e Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 13:44:05 -0700 Subject: [PATCH 47/60] Attempted bugfix in pkgdown action --- .github/workflows/pkgdown.yaml | 1 + 1 file changed, 1 insertion(+) diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml index f79a44e..f9498b6 100644 --- a/.github/workflows/pkgdown.yaml +++ b/.github/workflows/pkgdown.yaml @@ -30,6 +30,7 @@ jobs: - uses: r-lib/actions/setup-r-dependencies@v2 with: + packages: XML extra-packages: any::pkgdown, local::. needs: website From caade01f4b0318f497cc58a431386b6ed2c8dba4 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 14:04:47 -0700 Subject: [PATCH 48/60] Fix arcticdatautils import --- DESCRIPTION | 5 +++-- man/DPchecker-package.Rd | 7 +++++++ 2 files changed, 10 insertions(+), 2 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 25470b2..3ab3a30 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -28,6 +28,7 @@ Imports: purrr, stringr, tibble -Remotes: - nationalparkservice/EMLeditor +Remotes: + nationalparkservice/EMLeditor, + https://github.com/NCEAS/arcticdatautils URL: https://nationalparkservice.github.io/DPchecker/ diff --git a/man/DPchecker-package.Rd b/man/DPchecker-package.Rd index ee5313f..a6e3f63 100644 --- a/man/DPchecker-package.Rd +++ b/man/DPchecker-package.Rd @@ -7,6 +7,13 @@ \title{DPchecker: Checks Data Packages for Congruence} \description{ Allows the user (and reviewer) to check a data package and test whether it meets the congruence standards set forth by NPS for upload to DataStore as a datapackage. +} +\seealso{ +Useful links: +\itemize{ + \item \url{https://nationalparkservice.github.io/DPchecker/} +} + } \author{ \strong{Maintainer}: Rob Baker \email{robert_baker@nps.gov} From d4263500f6a99dfb7c3f14d218232047b5247b16 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 14:11:06 -0700 Subject: [PATCH 49/60] Get rid of non-pkgdown actions, try another pkgdown fix --- .github/workflows/R-CMD-check.yaml | 49 --------------------------- .github/workflows/pkgdown.yaml | 2 +- .github/workflows/test-coverage.yaml | 50 ---------------------------- README.md | 4 --- 4 files changed, 1 insertion(+), 104 deletions(-) delete mode 100644 .github/workflows/R-CMD-check.yaml delete mode 100644 .github/workflows/test-coverage.yaml diff --git a/.github/workflows/R-CMD-check.yaml b/.github/workflows/R-CMD-check.yaml deleted file mode 100644 index 5538a71..0000000 --- a/.github/workflows/R-CMD-check.yaml +++ /dev/null @@ -1,49 +0,0 @@ -# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples -# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help -on: - push: - branches: [main, master, unit-testing] - pull_request: - branches: [main, master] - -name: R-CMD-check - -jobs: - R-CMD-check: - runs-on: ${{ matrix.config.os }} - - name: ${{ matrix.config.os }} (${{ matrix.config.r }}) - - strategy: - fail-fast: false - matrix: - config: - - {os: macos-latest, r: 'release'} - - {os: windows-latest, r: 'release'} - - {os: ubuntu-latest, r: 'devel', http-user-agent: 'release'} - - {os: ubuntu-latest, r: 'release'} - - {os: ubuntu-latest, r: 'oldrel-1'} - - env: - GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} - R_KEEP_PKG_SOURCE: yes - - steps: - - uses: actions/checkout@v3 - - - uses: r-lib/actions/setup-pandoc@v2 - - - uses: r-lib/actions/setup-r@v2 - with: - r-version: ${{ matrix.config.r }} - http-user-agent: ${{ matrix.config.http-user-agent }} - use-public-rspm: true - - - uses: r-lib/actions/setup-r-dependencies@v2 - with: - extra-packages: any::rcmdcheck - needs: check - - - uses: r-lib/actions/check-r-package@v2 - with: - upload-snapshots: true diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml index f9498b6..24fcee0 100644 --- a/.github/workflows/pkgdown.yaml +++ b/.github/workflows/pkgdown.yaml @@ -30,7 +30,7 @@ jobs: - uses: r-lib/actions/setup-r-dependencies@v2 with: - packages: XML + packages: any::XML extra-packages: any::pkgdown, local::. needs: website diff --git a/.github/workflows/test-coverage.yaml b/.github/workflows/test-coverage.yaml deleted file mode 100644 index 1a2b8db..0000000 --- a/.github/workflows/test-coverage.yaml +++ /dev/null @@ -1,50 +0,0 @@ -# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples -# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help -on: - push: - branches: [main, master, unit-testing] - pull_request: - branches: [main, master] - -name: test-coverage - -jobs: - test-coverage: - runs-on: ubuntu-latest - env: - GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} - - steps: - - uses: actions/checkout@v3 - - - uses: r-lib/actions/setup-r@v2 - with: - use-public-rspm: true - - - uses: r-lib/actions/setup-r-dependencies@v2 - with: - extra-packages: any::covr - needs: coverage - - - name: Test coverage - run: | - covr::codecov( - quiet = FALSE, - clean = FALSE, - install_path = file.path(Sys.getenv("RUNNER_TEMP"), "package") - ) - shell: Rscript {0} - - - name: Show testthat output - if: always() - run: | - ## -------------------------------------------------------------------- - find ${{ runner.temp }}/package -name 'testthat.Rout*' -exec cat '{}' \; || true - shell: bash - - - name: Upload test results - if: failure() - uses: actions/upload-artifact@v3 - with: - name: coverage-test-failures - path: ${{ runner.temp }}/package diff --git a/README.md b/README.md index 3c972d5..faf365b 100644 --- a/README.md +++ b/README.md @@ -4,10 +4,6 @@ #### v0.0.0.9000 - -[![R-CMD-check](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml/badge.svg)](https://github.com/nationalparkservice/DPchecker/actions/workflows/R-CMD-check.yaml) - - DPchecker (Data Package checker) is a package with a series of functions for NPS data package authors and reviewers to check for internal consistency among data/meta data and with the data package standards. Currently, *only EML metadata and .csv data files* are supported. All data files and the single metadata file (named *_metadata.xml) must be in the same directory. From ffbe9bcdb6517faa8bc954807abff38339828a41 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 14:15:55 -0700 Subject: [PATCH 50/60] Maybe this time --- .github/workflows/pkgdown.yaml | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml index 24fcee0..f378210 100644 --- a/.github/workflows/pkgdown.yaml +++ b/.github/workflows/pkgdown.yaml @@ -31,7 +31,7 @@ jobs: - uses: r-lib/actions/setup-r-dependencies@v2 with: packages: any::XML - extra-packages: any::pkgdown, local::. + extra-packages: any::pkgdown needs: website - name: Build site From 7a39d4f95e994fefbcc29767cd611a52ea967d7b Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 14:26:30 -0700 Subject: [PATCH 51/60] Manually create pkgdown site --- .github/.gitignore | 1 - .github/workflows/pkgdown.yaml | 47 ---------------------------------- R/tabular_data_congruence.R | 1 + _pkgdown.yml | 2 +- man/convert_datetime_format.Rd | 1 + 5 files changed, 3 insertions(+), 49 deletions(-) delete mode 100644 .github/.gitignore delete mode 100644 .github/workflows/pkgdown.yaml diff --git a/.github/.gitignore b/.github/.gitignore deleted file mode 100644 index 2d19fc7..0000000 --- a/.github/.gitignore +++ /dev/null @@ -1 +0,0 @@ -*.html diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml deleted file mode 100644 index f378210..0000000 --- a/.github/workflows/pkgdown.yaml +++ /dev/null @@ -1,47 +0,0 @@ -# Workflow derived from https://github.com/r-lib/actions/tree/v2/examples -# Need help debugging build failures? Start at https://github.com/r-lib/actions#where-to-find-help -on: - push: - branches: [main, master, unit-testing] - pull_request: - branches: [main, master] - release: - types: [published] - workflow_dispatch: - -name: pkgdown - -jobs: - pkgdown: - runs-on: ubuntu-latest - # Only restrict concurrency for non-PR jobs - concurrency: - group: pkgdown-${{ github.event_name != 'pull_request' || github.run_id }} - env: - GITHUB_PAT: ${{ secrets.GITHUB_TOKEN }} - steps: - - uses: actions/checkout@v3 - - - uses: r-lib/actions/setup-pandoc@v2 - - - uses: r-lib/actions/setup-r@v2 - with: - use-public-rspm: true - - - uses: r-lib/actions/setup-r-dependencies@v2 - with: - packages: any::XML - extra-packages: any::pkgdown - needs: website - - - name: Build site - run: pkgdown::build_site_github_pages(new_process = FALSE, install = FALSE) - shell: Rscript {0} - - - name: Deploy to GitHub pages 🚀 - if: github.event_name != 'pull_request' - uses: JamesIves/github-pages-deploy-action@v4.4.1 - with: - clean: false - branch: gh-pages - folder: docs diff --git a/R/tabular_data_congruence.R b/R/tabular_data_congruence.R index 6b3ffc9..b75275d 100644 --- a/R/tabular_data_congruence.R +++ b/R/tabular_data_congruence.R @@ -696,6 +696,7 @@ DPchecker_example <- function(dp_name = NULL) { #' @examples #' convert_datetime_format("MM/DD/YYYY") #' convert_datetime_format(c("MM/DD/YYYY", "YY-MM-DD")) +#' convert_datetime_format <- function(eml_format_string) { r_format_string <- eml_format_string %>% stringr::str_replace_all("YYYY", "%Y") %>% diff --git a/_pkgdown.yml b/_pkgdown.yml index dea6886..d71acfb 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -1,4 +1,4 @@ -url: https://nationalparkservice.github.io/DPchecker/ +url: ~ template: bootstrap: 5 diff --git a/man/convert_datetime_format.Rd b/man/convert_datetime_format.Rd index f61cca0..eba79aa 100644 --- a/man/convert_datetime_format.Rd +++ b/man/convert_datetime_format.Rd @@ -21,4 +21,5 @@ This is not a sophisticated function. If the EML format string is not valid, it \examples{ convert_datetime_format("MM/DD/YYYY") convert_datetime_format(c("MM/DD/YYYY", "YY-MM-DD")) + } From 279da5854d8868c77e6e54c5517d68ab9d2a6892 Mon Sep 17 00:00:00 2001 From: Wright Date: Wed, 14 Dec 2022 14:29:29 -0700 Subject: [PATCH 52/60] remove docs from gitignore --- .gitignore | 1 - docs/404.html | 80 + docs/LICENSE-text.html | 60 + docs/LICENSE.html | 64 + docs/authors.html | 97 + .../bootstrap-5.1.0/bootstrap.bundle.min.js | 7 + .../bootstrap.bundle.min.js.map | 1 + docs/deps/bootstrap-5.1.0/bootstrap.min.css | 1 + docs/deps/data-deps.txt | 4 + docs/deps/jquery-3.6.0/jquery-3.6.0.js | 10881 ++++++++++++++++ docs/deps/jquery-3.6.0/jquery-3.6.0.min.js | 2 + docs/deps/jquery-3.6.0/jquery-3.6.0.min.map | 1 + docs/index.html | 137 + docs/link.svg | 12 + docs/pkgdown.js | 156 + docs/pkgdown.yml | 6 + docs/reference/DPchecker-package.html | 77 + docs/reference/DPchecker_example.html | 89 + docs/reference/Rplot001.png | Bin 0 -> 1011 bytes docs/reference/convert_datetime_format.html | 93 + docs/reference/index.html | 137 + docs/reference/load_data.html | 91 + docs/reference/load_metadata.html | 96 + docs/reference/test_date_range.html | 97 + docs/reference/test_delimiter.html | 93 + docs/reference/test_dup_meta_entries.html | 92 + docs/reference/test_fields_match.html | 99 + docs/reference/test_file_name_match.html | 100 + docs/reference/test_footer.html | 92 + docs/reference/test_header_num.html | 92 + docs/reference/test_metadata_version.html | 92 + docs/reference/test_numeric_fields.html | 100 + docs/reference/test_validate_schema.html | 92 + docs/search.json | 1 + docs/sitemap.xml | 66 + 35 files changed, 13108 insertions(+), 1 deletion(-) create mode 100644 docs/404.html create mode 100644 docs/LICENSE-text.html create mode 100644 docs/LICENSE.html create mode 100644 docs/authors.html create mode 100644 docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js create mode 100644 docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js.map create mode 100644 docs/deps/bootstrap-5.1.0/bootstrap.min.css create mode 100644 docs/deps/data-deps.txt create mode 100644 docs/deps/jquery-3.6.0/jquery-3.6.0.js create mode 100644 docs/deps/jquery-3.6.0/jquery-3.6.0.min.js create mode 100644 docs/deps/jquery-3.6.0/jquery-3.6.0.min.map create mode 100644 docs/index.html create mode 100644 docs/link.svg create mode 100644 docs/pkgdown.js create mode 100644 docs/pkgdown.yml create mode 100644 docs/reference/DPchecker-package.html create mode 100644 docs/reference/DPchecker_example.html create mode 100644 docs/reference/Rplot001.png create mode 100644 docs/reference/convert_datetime_format.html create mode 100644 docs/reference/index.html create mode 100644 docs/reference/load_data.html create mode 100644 docs/reference/load_metadata.html create mode 100644 docs/reference/test_date_range.html create mode 100644 docs/reference/test_delimiter.html create mode 100644 docs/reference/test_dup_meta_entries.html create mode 100644 docs/reference/test_fields_match.html create mode 100644 docs/reference/test_file_name_match.html create mode 100644 docs/reference/test_footer.html create mode 100644 docs/reference/test_header_num.html create mode 100644 docs/reference/test_metadata_version.html create mode 100644 docs/reference/test_numeric_fields.html create mode 100644 docs/reference/test_validate_schema.html create mode 100644 docs/search.json create mode 100644 docs/sitemap.xml diff --git a/.gitignore b/.gitignore index 0e19d9b..26b96c6 100644 --- a/.gitignore +++ b/.gitignore @@ -3,4 +3,3 @@ .RData .Ruserdata scratchpad/* -docs diff --git a/docs/404.html b/docs/404.html new file mode 100644 index 0000000..daffa0a --- /dev/null +++ b/docs/404.html @@ -0,0 +1,80 @@ + + + + + + + +Page not found (404) • DPchecker + + + + + + + + + Skip to contents + + +
+
+
+ +Content not found. Please use links in the navbar. + +
+
+ + +
+ + + +
+
+ + + + + + + diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html new file mode 100644 index 0000000..d270c8c --- /dev/null +++ b/docs/LICENSE-text.html @@ -0,0 +1,60 @@ + +License • DPchecker + Skip to contents + + +
+
+
+ +
YEAR: 2022
+COPYRIGHT HOLDER: DPchecker authors
+
+ +
+ + +
+ + + +
+ + + + + + + diff --git a/docs/LICENSE.html b/docs/LICENSE.html new file mode 100644 index 0000000..fecbb03 --- /dev/null +++ b/docs/LICENSE.html @@ -0,0 +1,64 @@ + +MIT License • DPchecker + Skip to contents + + +
+
+
+ +
+ +

Copyright (c) 2022 DPchecker authors

+

Permission is hereby granted, free of charge, to any person obtaining a copy of this software and associated documentation files (the “Software”), to deal in the Software without restriction, including without limitation the rights to use, copy, modify, merge, publish, distribute, sublicense, and/or sell copies of the Software, and to permit persons to whom the Software is furnished to do so, subject to the following conditions:

+

The above copyright notice and this permission notice shall be included in all copies or substantial portions of the Software.

+

THE SOFTWARE IS PROVIDED “AS IS”, WITHOUT WARRANTY OF ANY KIND, EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN THE SOFTWARE.

+
+ +
+ + +
+ + + +
+ + + + + + + diff --git a/docs/authors.html b/docs/authors.html new file mode 100644 index 0000000..c46bf29 --- /dev/null +++ b/docs/authors.html @@ -0,0 +1,97 @@ + +Authors and Citation • DPchecker + Skip to contents + + +
+
+
+ +
+

Authors

+ +
  • +

    Rob Baker. Maintainer. +

    +
  • +
  • +

    Rob Baker. Author. +

    +
  • +
  • +

    Sarah E. Wright. Author. +

    +
  • +
  • +

    Issac Quevedo. Contributor. +

    +
  • +
  • +

    Amelia Sherman. Contributor. +

    +
  • +
+ +
+

Citation

+

+ +

Baker R, Wright SE (2022). +DPchecker: Checks Data Packages for Congruence. +R package version 0.0.0.9000, https://nationalparkservice.github.io/DPchecker/. +

+
@Manual{,
+  title = {DPchecker: Checks Data Packages for Congruence},
+  author = {Rob Baker and Sarah E. Wright},
+  year = {2022},
+  note = {R package version 0.0.0.9000},
+  url = {https://nationalparkservice.github.io/DPchecker/},
+}
+
+
+ + +
+ + + +
+ + + + + + + diff --git a/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js b/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js new file mode 100644 index 0000000..b65b161 --- /dev/null +++ b/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js @@ -0,0 +1,7 @@ +/*! + * Bootstrap v5.1.0 (https://getbootstrap.com/) + * Copyright 2011-2021 The Bootstrap Authors (https://github.com/twbs/bootstrap/graphs/contributors) + * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE) + */ +!function(t,e){"object"==typeof exports&&"undefined"!=typeof module?module.exports=e():"function"==typeof define&&define.amd?define(e):(t="undefined"!=typeof globalThis?globalThis:t||self).bootstrap=e()}(this,(function(){"use strict";const t=t=>{let e=t.getAttribute("data-bs-target");if(!e||"#"===e){let i=t.getAttribute("href");if(!i||!i.includes("#")&&!i.startsWith("."))return null;i.includes("#")&&!i.startsWith("#")&&(i="#"+i.split("#")[1]),e=i&&"#"!==i?i.trim():null}return e},e=e=>{const i=t(e);return i&&document.querySelector(i)?i:null},i=e=>{const i=t(e);return i?document.querySelector(i):null},n=t=>{t.dispatchEvent(new Event("transitionend"))},s=t=>!(!t||"object"!=typeof t)&&(void 0!==t.jquery&&(t=t[0]),void 0!==t.nodeType),o=t=>s(t)?t.jquery?t[0]:t:"string"==typeof t&&t.length>0?document.querySelector(t):null,r=(t,e,i)=>{Object.keys(i).forEach(n=>{const o=i[n],r=e[n],a=r&&s(r)?"element":null==(l=r)?""+l:{}.toString.call(l).match(/\s([a-z]+)/i)[1].toLowerCase();var l;if(!new RegExp(o).test(a))throw new TypeError(`${t.toUpperCase()}: Option "${n}" provided type "${a}" but expected type "${o}".`)})},a=t=>!(!s(t)||0===t.getClientRects().length)&&"visible"===getComputedStyle(t).getPropertyValue("visibility"),l=t=>!t||t.nodeType!==Node.ELEMENT_NODE||!!t.classList.contains("disabled")||(void 0!==t.disabled?t.disabled:t.hasAttribute("disabled")&&"false"!==t.getAttribute("disabled")),c=t=>{if(!document.documentElement.attachShadow)return null;if("function"==typeof t.getRootNode){const e=t.getRootNode();return e instanceof ShadowRoot?e:null}return t instanceof ShadowRoot?t:t.parentNode?c(t.parentNode):null},h=()=>{},d=t=>{t.offsetHeight},u=()=>{const{jQuery:t}=window;return t&&!document.body.hasAttribute("data-bs-no-jquery")?t:null},f=[],p=()=>"rtl"===document.documentElement.dir,m=t=>{var e;e=()=>{const e=u();if(e){const i=t.NAME,n=e.fn[i];e.fn[i]=t.jQueryInterface,e.fn[i].Constructor=t,e.fn[i].noConflict=()=>(e.fn[i]=n,t.jQueryInterface)}},"loading"===document.readyState?(f.length||document.addEventListener("DOMContentLoaded",()=>{f.forEach(t=>t())}),f.push(e)):e()},g=t=>{"function"==typeof t&&t()},_=(t,e,i=!0)=>{if(!i)return void g(t);const s=(t=>{if(!t)return 0;let{transitionDuration:e,transitionDelay:i}=window.getComputedStyle(t);const n=Number.parseFloat(e),s=Number.parseFloat(i);return n||s?(e=e.split(",")[0],i=i.split(",")[0],1e3*(Number.parseFloat(e)+Number.parseFloat(i))):0})(e)+5;let o=!1;const r=({target:i})=>{i===e&&(o=!0,e.removeEventListener("transitionend",r),g(t))};e.addEventListener("transitionend",r),setTimeout(()=>{o||n(e)},s)},b=(t,e,i,n)=>{let s=t.indexOf(e);if(-1===s)return t[!i&&n?t.length-1:0];const o=t.length;return s+=i?1:-1,n&&(s=(s+o)%o),t[Math.max(0,Math.min(s,o-1))]},v=/[^.]*(?=\..*)\.|.*/,y=/\..*/,w=/::\d+$/,E={};let A=1;const T={mouseenter:"mouseover",mouseleave:"mouseout"},O=/^(mouseenter|mouseleave)/i,C=new Set(["click","dblclick","mouseup","mousedown","contextmenu","mousewheel","DOMMouseScroll","mouseover","mouseout","mousemove","selectstart","selectend","keydown","keypress","keyup","orientationchange","touchstart","touchmove","touchend","touchcancel","pointerdown","pointermove","pointerup","pointerleave","pointercancel","gesturestart","gesturechange","gestureend","focus","blur","change","reset","select","submit","focusin","focusout","load","unload","beforeunload","resize","move","DOMContentLoaded","readystatechange","error","abort","scroll"]);function k(t,e){return e&&`${e}::${A++}`||t.uidEvent||A++}function L(t){const e=k(t);return t.uidEvent=e,E[e]=E[e]||{},E[e]}function x(t,e,i=null){const n=Object.keys(t);for(let s=0,o=n.length;sfunction(e){if(!e.relatedTarget||e.relatedTarget!==e.delegateTarget&&!e.delegateTarget.contains(e.relatedTarget))return t.call(this,e)};n?n=t(n):i=t(i)}const[o,r,a]=D(e,i,n),l=L(t),c=l[a]||(l[a]={}),h=x(c,r,o?i:null);if(h)return void(h.oneOff=h.oneOff&&s);const d=k(r,e.replace(v,"")),u=o?function(t,e,i){return function n(s){const o=t.querySelectorAll(e);for(let{target:r}=s;r&&r!==this;r=r.parentNode)for(let a=o.length;a--;)if(o[a]===r)return s.delegateTarget=r,n.oneOff&&P.off(t,s.type,e,i),i.apply(r,[s]);return null}}(t,i,n):function(t,e){return function i(n){return n.delegateTarget=t,i.oneOff&&P.off(t,n.type,e),e.apply(t,[n])}}(t,i);u.delegationSelector=o?i:null,u.originalHandler=r,u.oneOff=s,u.uidEvent=d,c[d]=u,t.addEventListener(a,u,o)}function N(t,e,i,n,s){const o=x(e[i],n,s);o&&(t.removeEventListener(i,o,Boolean(s)),delete e[i][o.uidEvent])}function I(t){return t=t.replace(y,""),T[t]||t}const P={on(t,e,i,n){S(t,e,i,n,!1)},one(t,e,i,n){S(t,e,i,n,!0)},off(t,e,i,n){if("string"!=typeof e||!t)return;const[s,o,r]=D(e,i,n),a=r!==e,l=L(t),c=e.startsWith(".");if(void 0!==o){if(!l||!l[r])return;return void N(t,l,r,o,s?i:null)}c&&Object.keys(l).forEach(i=>{!function(t,e,i,n){const s=e[i]||{};Object.keys(s).forEach(o=>{if(o.includes(n)){const n=s[o];N(t,e,i,n.originalHandler,n.delegationSelector)}})}(t,l,i,e.slice(1))});const h=l[r]||{};Object.keys(h).forEach(i=>{const n=i.replace(w,"");if(!a||e.includes(n)){const e=h[i];N(t,l,r,e.originalHandler,e.delegationSelector)}})},trigger(t,e,i){if("string"!=typeof e||!t)return null;const n=u(),s=I(e),o=e!==s,r=C.has(s);let a,l=!0,c=!0,h=!1,d=null;return o&&n&&(a=n.Event(e,i),n(t).trigger(a),l=!a.isPropagationStopped(),c=!a.isImmediatePropagationStopped(),h=a.isDefaultPrevented()),r?(d=document.createEvent("HTMLEvents"),d.initEvent(s,l,!0)):d=new CustomEvent(e,{bubbles:l,cancelable:!0}),void 0!==i&&Object.keys(i).forEach(t=>{Object.defineProperty(d,t,{get:()=>i[t]})}),h&&d.preventDefault(),c&&t.dispatchEvent(d),d.defaultPrevented&&void 0!==a&&a.preventDefault(),d}},j=new Map;var M={set(t,e,i){j.has(t)||j.set(t,new Map);const n=j.get(t);n.has(e)||0===n.size?n.set(e,i):console.error(`Bootstrap doesn't allow more than one instance per element. Bound instance: ${Array.from(n.keys())[0]}.`)},get:(t,e)=>j.has(t)&&j.get(t).get(e)||null,remove(t,e){if(!j.has(t))return;const i=j.get(t);i.delete(e),0===i.size&&j.delete(t)}};class H{constructor(t){(t=o(t))&&(this._element=t,M.set(this._element,this.constructor.DATA_KEY,this))}dispose(){M.remove(this._element,this.constructor.DATA_KEY),P.off(this._element,this.constructor.EVENT_KEY),Object.getOwnPropertyNames(this).forEach(t=>{this[t]=null})}_queueCallback(t,e,i=!0){_(t,e,i)}static getInstance(t){return M.get(o(t),this.DATA_KEY)}static getOrCreateInstance(t,e={}){return this.getInstance(t)||new this(t,"object"==typeof e?e:null)}static get VERSION(){return"5.1.0"}static get NAME(){throw new Error('You have to implement the static method "NAME", for each component!')}static get DATA_KEY(){return"bs."+this.NAME}static get EVENT_KEY(){return"."+this.DATA_KEY}}const B=(t,e="hide")=>{const n="click.dismiss"+t.EVENT_KEY,s=t.NAME;P.on(document,n,`[data-bs-dismiss="${s}"]`,(function(n){if(["A","AREA"].includes(this.tagName)&&n.preventDefault(),l(this))return;const o=i(this)||this.closest("."+s);t.getOrCreateInstance(o)[e]()}))};class R extends H{static get NAME(){return"alert"}close(){if(P.trigger(this._element,"close.bs.alert").defaultPrevented)return;this._element.classList.remove("show");const t=this._element.classList.contains("fade");this._queueCallback(()=>this._destroyElement(),this._element,t)}_destroyElement(){this._element.remove(),P.trigger(this._element,"closed.bs.alert"),this.dispose()}static jQueryInterface(t){return this.each((function(){const e=R.getOrCreateInstance(this);if("string"==typeof t){if(void 0===e[t]||t.startsWith("_")||"constructor"===t)throw new TypeError(`No method named "${t}"`);e[t](this)}}))}}B(R,"close"),m(R);class W extends H{static get NAME(){return"button"}toggle(){this._element.setAttribute("aria-pressed",this._element.classList.toggle("active"))}static jQueryInterface(t){return this.each((function(){const e=W.getOrCreateInstance(this);"toggle"===t&&e[t]()}))}}function z(t){return"true"===t||"false"!==t&&(t===Number(t).toString()?Number(t):""===t||"null"===t?null:t)}function q(t){return t.replace(/[A-Z]/g,t=>"-"+t.toLowerCase())}P.on(document,"click.bs.button.data-api",'[data-bs-toggle="button"]',t=>{t.preventDefault();const e=t.target.closest('[data-bs-toggle="button"]');W.getOrCreateInstance(e).toggle()}),m(W);const F={setDataAttribute(t,e,i){t.setAttribute("data-bs-"+q(e),i)},removeDataAttribute(t,e){t.removeAttribute("data-bs-"+q(e))},getDataAttributes(t){if(!t)return{};const e={};return Object.keys(t.dataset).filter(t=>t.startsWith("bs")).forEach(i=>{let n=i.replace(/^bs/,"");n=n.charAt(0).toLowerCase()+n.slice(1,n.length),e[n]=z(t.dataset[i])}),e},getDataAttribute:(t,e)=>z(t.getAttribute("data-bs-"+q(e))),offset(t){const e=t.getBoundingClientRect();return{top:e.top+window.pageYOffset,left:e.left+window.pageXOffset}},position:t=>({top:t.offsetTop,left:t.offsetLeft})},U={find:(t,e=document.documentElement)=>[].concat(...Element.prototype.querySelectorAll.call(e,t)),findOne:(t,e=document.documentElement)=>Element.prototype.querySelector.call(e,t),children:(t,e)=>[].concat(...t.children).filter(t=>t.matches(e)),parents(t,e){const i=[];let n=t.parentNode;for(;n&&n.nodeType===Node.ELEMENT_NODE&&3!==n.nodeType;)n.matches(e)&&i.push(n),n=n.parentNode;return i},prev(t,e){let i=t.previousElementSibling;for(;i;){if(i.matches(e))return[i];i=i.previousElementSibling}return[]},next(t,e){let i=t.nextElementSibling;for(;i;){if(i.matches(e))return[i];i=i.nextElementSibling}return[]},focusableChildren(t){const e=["a","button","input","textarea","select","details","[tabindex]",'[contenteditable="true"]'].map(t=>t+':not([tabindex^="-"])').join(", ");return this.find(e,t).filter(t=>!l(t)&&a(t))}},$={interval:5e3,keyboard:!0,slide:!1,pause:"hover",wrap:!0,touch:!0},V={interval:"(number|boolean)",keyboard:"boolean",slide:"(boolean|string)",pause:"(string|boolean)",wrap:"boolean",touch:"boolean"},K="next",X="prev",Y="left",Q="right",G={ArrowLeft:Q,ArrowRight:Y};class Z extends H{constructor(t,e){super(t),this._items=null,this._interval=null,this._activeElement=null,this._isPaused=!1,this._isSliding=!1,this.touchTimeout=null,this.touchStartX=0,this.touchDeltaX=0,this._config=this._getConfig(e),this._indicatorsElement=U.findOne(".carousel-indicators",this._element),this._touchSupported="ontouchstart"in document.documentElement||navigator.maxTouchPoints>0,this._pointerEvent=Boolean(window.PointerEvent),this._addEventListeners()}static get Default(){return $}static get NAME(){return"carousel"}next(){this._slide(K)}nextWhenVisible(){!document.hidden&&a(this._element)&&this.next()}prev(){this._slide(X)}pause(t){t||(this._isPaused=!0),U.findOne(".carousel-item-next, .carousel-item-prev",this._element)&&(n(this._element),this.cycle(!0)),clearInterval(this._interval),this._interval=null}cycle(t){t||(this._isPaused=!1),this._interval&&(clearInterval(this._interval),this._interval=null),this._config&&this._config.interval&&!this._isPaused&&(this._updateInterval(),this._interval=setInterval((document.visibilityState?this.nextWhenVisible:this.next).bind(this),this._config.interval))}to(t){this._activeElement=U.findOne(".active.carousel-item",this._element);const e=this._getItemIndex(this._activeElement);if(t>this._items.length-1||t<0)return;if(this._isSliding)return void P.one(this._element,"slid.bs.carousel",()=>this.to(t));if(e===t)return this.pause(),void this.cycle();const i=t>e?K:X;this._slide(i,this._items[t])}_getConfig(t){return t={...$,...F.getDataAttributes(this._element),..."object"==typeof t?t:{}},r("carousel",t,V),t}_handleSwipe(){const t=Math.abs(this.touchDeltaX);if(t<=40)return;const e=t/this.touchDeltaX;this.touchDeltaX=0,e&&this._slide(e>0?Q:Y)}_addEventListeners(){this._config.keyboard&&P.on(this._element,"keydown.bs.carousel",t=>this._keydown(t)),"hover"===this._config.pause&&(P.on(this._element,"mouseenter.bs.carousel",t=>this.pause(t)),P.on(this._element,"mouseleave.bs.carousel",t=>this.cycle(t))),this._config.touch&&this._touchSupported&&this._addTouchEventListeners()}_addTouchEventListeners(){const t=t=>{!this._pointerEvent||"pen"!==t.pointerType&&"touch"!==t.pointerType?this._pointerEvent||(this.touchStartX=t.touches[0].clientX):this.touchStartX=t.clientX},e=t=>{this.touchDeltaX=t.touches&&t.touches.length>1?0:t.touches[0].clientX-this.touchStartX},i=t=>{!this._pointerEvent||"pen"!==t.pointerType&&"touch"!==t.pointerType||(this.touchDeltaX=t.clientX-this.touchStartX),this._handleSwipe(),"hover"===this._config.pause&&(this.pause(),this.touchTimeout&&clearTimeout(this.touchTimeout),this.touchTimeout=setTimeout(t=>this.cycle(t),500+this._config.interval))};U.find(".carousel-item img",this._element).forEach(t=>{P.on(t,"dragstart.bs.carousel",t=>t.preventDefault())}),this._pointerEvent?(P.on(this._element,"pointerdown.bs.carousel",e=>t(e)),P.on(this._element,"pointerup.bs.carousel",t=>i(t)),this._element.classList.add("pointer-event")):(P.on(this._element,"touchstart.bs.carousel",e=>t(e)),P.on(this._element,"touchmove.bs.carousel",t=>e(t)),P.on(this._element,"touchend.bs.carousel",t=>i(t)))}_keydown(t){if(/input|textarea/i.test(t.target.tagName))return;const e=G[t.key];e&&(t.preventDefault(),this._slide(e))}_getItemIndex(t){return this._items=t&&t.parentNode?U.find(".carousel-item",t.parentNode):[],this._items.indexOf(t)}_getItemByOrder(t,e){const i=t===K;return b(this._items,e,i,this._config.wrap)}_triggerSlideEvent(t,e){const i=this._getItemIndex(t),n=this._getItemIndex(U.findOne(".active.carousel-item",this._element));return P.trigger(this._element,"slide.bs.carousel",{relatedTarget:t,direction:e,from:n,to:i})}_setActiveIndicatorElement(t){if(this._indicatorsElement){const e=U.findOne(".active",this._indicatorsElement);e.classList.remove("active"),e.removeAttribute("aria-current");const i=U.find("[data-bs-target]",this._indicatorsElement);for(let e=0;e{P.trigger(this._element,"slid.bs.carousel",{relatedTarget:o,direction:u,from:s,to:r})};if(this._element.classList.contains("slide")){o.classList.add(h),d(o),n.classList.add(c),o.classList.add(c);const t=()=>{o.classList.remove(c,h),o.classList.add("active"),n.classList.remove("active",h,c),this._isSliding=!1,setTimeout(f,0)};this._queueCallback(t,n,!0)}else n.classList.remove("active"),o.classList.add("active"),this._isSliding=!1,f();a&&this.cycle()}_directionToOrder(t){return[Q,Y].includes(t)?p()?t===Y?X:K:t===Y?K:X:t}_orderToDirection(t){return[K,X].includes(t)?p()?t===X?Y:Q:t===X?Q:Y:t}static carouselInterface(t,e){const i=Z.getOrCreateInstance(t,e);let{_config:n}=i;"object"==typeof e&&(n={...n,...e});const s="string"==typeof e?e:n.slide;if("number"==typeof e)i.to(e);else if("string"==typeof s){if(void 0===i[s])throw new TypeError(`No method named "${s}"`);i[s]()}else n.interval&&n.ride&&(i.pause(),i.cycle())}static jQueryInterface(t){return this.each((function(){Z.carouselInterface(this,t)}))}static dataApiClickHandler(t){const e=i(this);if(!e||!e.classList.contains("carousel"))return;const n={...F.getDataAttributes(e),...F.getDataAttributes(this)},s=this.getAttribute("data-bs-slide-to");s&&(n.interval=!1),Z.carouselInterface(e,n),s&&Z.getInstance(e).to(s),t.preventDefault()}}P.on(document,"click.bs.carousel.data-api","[data-bs-slide], [data-bs-slide-to]",Z.dataApiClickHandler),P.on(window,"load.bs.carousel.data-api",()=>{const t=U.find('[data-bs-ride="carousel"]');for(let e=0,i=t.length;et===this._element);null!==s&&o.length&&(this._selector=s,this._triggerArray.push(i))}this._initializeChildren(),this._config.parent||this._addAriaAndCollapsedClass(this._triggerArray,this._isShown()),this._config.toggle&&this.toggle()}static get Default(){return J}static get NAME(){return"collapse"}toggle(){this._isShown()?this.hide():this.show()}show(){if(this._isTransitioning||this._isShown())return;let t,e=[];if(this._config.parent){const t=U.find(".collapse .collapse",this._config.parent);e=U.find(".show, .collapsing",this._config.parent).filter(e=>!t.includes(e))}const i=U.findOne(this._selector);if(e.length){const n=e.find(t=>i!==t);if(t=n?et.getInstance(n):null,t&&t._isTransitioning)return}if(P.trigger(this._element,"show.bs.collapse").defaultPrevented)return;e.forEach(e=>{i!==e&&et.getOrCreateInstance(e,{toggle:!1}).hide(),t||M.set(e,"bs.collapse",null)});const n=this._getDimension();this._element.classList.remove("collapse"),this._element.classList.add("collapsing"),this._element.style[n]=0,this._addAriaAndCollapsedClass(this._triggerArray,!0),this._isTransitioning=!0;const s="scroll"+(n[0].toUpperCase()+n.slice(1));this._queueCallback(()=>{this._isTransitioning=!1,this._element.classList.remove("collapsing"),this._element.classList.add("collapse","show"),this._element.style[n]="",P.trigger(this._element,"shown.bs.collapse")},this._element,!0),this._element.style[n]=this._element[s]+"px"}hide(){if(this._isTransitioning||!this._isShown())return;if(P.trigger(this._element,"hide.bs.collapse").defaultPrevented)return;const t=this._getDimension();this._element.style[t]=this._element.getBoundingClientRect()[t]+"px",d(this._element),this._element.classList.add("collapsing"),this._element.classList.remove("collapse","show");const e=this._triggerArray.length;for(let t=0;t{this._isTransitioning=!1,this._element.classList.remove("collapsing"),this._element.classList.add("collapse"),P.trigger(this._element,"hidden.bs.collapse")},this._element,!0)}_isShown(t=this._element){return t.classList.contains("show")}_getConfig(t){return(t={...J,...F.getDataAttributes(this._element),...t}).toggle=Boolean(t.toggle),t.parent=o(t.parent),r("collapse",t,tt),t}_getDimension(){return this._element.classList.contains("collapse-horizontal")?"width":"height"}_initializeChildren(){if(!this._config.parent)return;const t=U.find(".collapse .collapse",this._config.parent);U.find('[data-bs-toggle="collapse"]',this._config.parent).filter(e=>!t.includes(e)).forEach(t=>{const e=i(t);e&&this._addAriaAndCollapsedClass([t],this._isShown(e))})}_addAriaAndCollapsedClass(t,e){t.length&&t.forEach(t=>{e?t.classList.remove("collapsed"):t.classList.add("collapsed"),t.setAttribute("aria-expanded",e)})}static jQueryInterface(t){return this.each((function(){const e={};"string"==typeof t&&/show|hide/.test(t)&&(e.toggle=!1);const i=et.getOrCreateInstance(this,e);if("string"==typeof t){if(void 0===i[t])throw new TypeError(`No method named "${t}"`);i[t]()}}))}}P.on(document,"click.bs.collapse.data-api",'[data-bs-toggle="collapse"]',(function(t){("A"===t.target.tagName||t.delegateTarget&&"A"===t.delegateTarget.tagName)&&t.preventDefault();const i=e(this);U.find(i).forEach(t=>{et.getOrCreateInstance(t,{toggle:!1}).toggle()})})),m(et);var it="top",nt="bottom",st="right",ot="left",rt=[it,nt,st,ot],at=rt.reduce((function(t,e){return t.concat([e+"-start",e+"-end"])}),[]),lt=[].concat(rt,["auto"]).reduce((function(t,e){return t.concat([e,e+"-start",e+"-end"])}),[]),ct=["beforeRead","read","afterRead","beforeMain","main","afterMain","beforeWrite","write","afterWrite"];function ht(t){return t?(t.nodeName||"").toLowerCase():null}function dt(t){if(null==t)return window;if("[object Window]"!==t.toString()){var e=t.ownerDocument;return e&&e.defaultView||window}return t}function ut(t){return t instanceof dt(t).Element||t instanceof Element}function ft(t){return t instanceof dt(t).HTMLElement||t instanceof HTMLElement}function pt(t){return"undefined"!=typeof ShadowRoot&&(t instanceof dt(t).ShadowRoot||t instanceof ShadowRoot)}var mt={name:"applyStyles",enabled:!0,phase:"write",fn:function(t){var e=t.state;Object.keys(e.elements).forEach((function(t){var i=e.styles[t]||{},n=e.attributes[t]||{},s=e.elements[t];ft(s)&&ht(s)&&(Object.assign(s.style,i),Object.keys(n).forEach((function(t){var e=n[t];!1===e?s.removeAttribute(t):s.setAttribute(t,!0===e?"":e)})))}))},effect:function(t){var e=t.state,i={popper:{position:e.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(e.elements.popper.style,i.popper),e.styles=i,e.elements.arrow&&Object.assign(e.elements.arrow.style,i.arrow),function(){Object.keys(e.elements).forEach((function(t){var n=e.elements[t],s=e.attributes[t]||{},o=Object.keys(e.styles.hasOwnProperty(t)?e.styles[t]:i[t]).reduce((function(t,e){return t[e]="",t}),{});ft(n)&&ht(n)&&(Object.assign(n.style,o),Object.keys(s).forEach((function(t){n.removeAttribute(t)})))}))}},requires:["computeStyles"]};function gt(t){return t.split("-")[0]}var _t=Math.round;function bt(t,e){void 0===e&&(e=!1);var i=t.getBoundingClientRect(),n=1,s=1;return ft(t)&&e&&(n=i.width/t.offsetWidth||1,s=i.height/t.offsetHeight||1),{width:_t(i.width/n),height:_t(i.height/s),top:_t(i.top/s),right:_t(i.right/n),bottom:_t(i.bottom/s),left:_t(i.left/n),x:_t(i.left/n),y:_t(i.top/s)}}function vt(t){var e=bt(t),i=t.offsetWidth,n=t.offsetHeight;return Math.abs(e.width-i)<=1&&(i=e.width),Math.abs(e.height-n)<=1&&(n=e.height),{x:t.offsetLeft,y:t.offsetTop,width:i,height:n}}function yt(t,e){var i=e.getRootNode&&e.getRootNode();if(t.contains(e))return!0;if(i&&pt(i)){var n=e;do{if(n&&t.isSameNode(n))return!0;n=n.parentNode||n.host}while(n)}return!1}function wt(t){return dt(t).getComputedStyle(t)}function Et(t){return["table","td","th"].indexOf(ht(t))>=0}function At(t){return((ut(t)?t.ownerDocument:t.document)||window.document).documentElement}function Tt(t){return"html"===ht(t)?t:t.assignedSlot||t.parentNode||(pt(t)?t.host:null)||At(t)}function Ot(t){return ft(t)&&"fixed"!==wt(t).position?t.offsetParent:null}function Ct(t){for(var e=dt(t),i=Ot(t);i&&Et(i)&&"static"===wt(i).position;)i=Ot(i);return i&&("html"===ht(i)||"body"===ht(i)&&"static"===wt(i).position)?e:i||function(t){var e=-1!==navigator.userAgent.toLowerCase().indexOf("firefox");if(-1!==navigator.userAgent.indexOf("Trident")&&ft(t)&&"fixed"===wt(t).position)return null;for(var i=Tt(t);ft(i)&&["html","body"].indexOf(ht(i))<0;){var n=wt(i);if("none"!==n.transform||"none"!==n.perspective||"paint"===n.contain||-1!==["transform","perspective"].indexOf(n.willChange)||e&&"filter"===n.willChange||e&&n.filter&&"none"!==n.filter)return i;i=i.parentNode}return null}(t)||e}function kt(t){return["top","bottom"].indexOf(t)>=0?"x":"y"}var Lt=Math.max,xt=Math.min,Dt=Math.round;function St(t,e,i){return Lt(t,xt(e,i))}function Nt(t){return Object.assign({},{top:0,right:0,bottom:0,left:0},t)}function It(t,e){return e.reduce((function(e,i){return e[i]=t,e}),{})}var Pt={name:"arrow",enabled:!0,phase:"main",fn:function(t){var e,i=t.state,n=t.name,s=t.options,o=i.elements.arrow,r=i.modifiersData.popperOffsets,a=gt(i.placement),l=kt(a),c=[ot,st].indexOf(a)>=0?"height":"width";if(o&&r){var h=function(t,e){return Nt("number"!=typeof(t="function"==typeof t?t(Object.assign({},e.rects,{placement:e.placement})):t)?t:It(t,rt))}(s.padding,i),d=vt(o),u="y"===l?it:ot,f="y"===l?nt:st,p=i.rects.reference[c]+i.rects.reference[l]-r[l]-i.rects.popper[c],m=r[l]-i.rects.reference[l],g=Ct(o),_=g?"y"===l?g.clientHeight||0:g.clientWidth||0:0,b=p/2-m/2,v=h[u],y=_-d[c]-h[f],w=_/2-d[c]/2+b,E=St(v,w,y),A=l;i.modifiersData[n]=((e={})[A]=E,e.centerOffset=E-w,e)}},effect:function(t){var e=t.state,i=t.options.element,n=void 0===i?"[data-popper-arrow]":i;null!=n&&("string"!=typeof n||(n=e.elements.popper.querySelector(n)))&&yt(e.elements.popper,n)&&(e.elements.arrow=n)},requires:["popperOffsets"],requiresIfExists:["preventOverflow"]},jt={top:"auto",right:"auto",bottom:"auto",left:"auto"};function Mt(t){var e,i=t.popper,n=t.popperRect,s=t.placement,o=t.offsets,r=t.position,a=t.gpuAcceleration,l=t.adaptive,c=t.roundOffsets,h=!0===c?function(t){var e=t.x,i=t.y,n=window.devicePixelRatio||1;return{x:Dt(Dt(e*n)/n)||0,y:Dt(Dt(i*n)/n)||0}}(o):"function"==typeof c?c(o):o,d=h.x,u=void 0===d?0:d,f=h.y,p=void 0===f?0:f,m=o.hasOwnProperty("x"),g=o.hasOwnProperty("y"),_=ot,b=it,v=window;if(l){var y=Ct(i),w="clientHeight",E="clientWidth";y===dt(i)&&"static"!==wt(y=At(i)).position&&(w="scrollHeight",E="scrollWidth"),y=y,s===it&&(b=nt,p-=y[w]-n.height,p*=a?1:-1),s===ot&&(_=st,u-=y[E]-n.width,u*=a?1:-1)}var A,T=Object.assign({position:r},l&&jt);return a?Object.assign({},T,((A={})[b]=g?"0":"",A[_]=m?"0":"",A.transform=(v.devicePixelRatio||1)<2?"translate("+u+"px, "+p+"px)":"translate3d("+u+"px, "+p+"px, 0)",A)):Object.assign({},T,((e={})[b]=g?p+"px":"",e[_]=m?u+"px":"",e.transform="",e))}var Ht={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:function(t){var e=t.state,i=t.options,n=i.gpuAcceleration,s=void 0===n||n,o=i.adaptive,r=void 0===o||o,a=i.roundOffsets,l=void 0===a||a,c={placement:gt(e.placement),popper:e.elements.popper,popperRect:e.rects.popper,gpuAcceleration:s};null!=e.modifiersData.popperOffsets&&(e.styles.popper=Object.assign({},e.styles.popper,Mt(Object.assign({},c,{offsets:e.modifiersData.popperOffsets,position:e.options.strategy,adaptive:r,roundOffsets:l})))),null!=e.modifiersData.arrow&&(e.styles.arrow=Object.assign({},e.styles.arrow,Mt(Object.assign({},c,{offsets:e.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),e.attributes.popper=Object.assign({},e.attributes.popper,{"data-popper-placement":e.placement})},data:{}},Bt={passive:!0},Rt={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:function(t){var e=t.state,i=t.instance,n=t.options,s=n.scroll,o=void 0===s||s,r=n.resize,a=void 0===r||r,l=dt(e.elements.popper),c=[].concat(e.scrollParents.reference,e.scrollParents.popper);return o&&c.forEach((function(t){t.addEventListener("scroll",i.update,Bt)})),a&&l.addEventListener("resize",i.update,Bt),function(){o&&c.forEach((function(t){t.removeEventListener("scroll",i.update,Bt)})),a&&l.removeEventListener("resize",i.update,Bt)}},data:{}},Wt={left:"right",right:"left",bottom:"top",top:"bottom"};function zt(t){return t.replace(/left|right|bottom|top/g,(function(t){return Wt[t]}))}var qt={start:"end",end:"start"};function Ft(t){return t.replace(/start|end/g,(function(t){return qt[t]}))}function Ut(t){var e=dt(t);return{scrollLeft:e.pageXOffset,scrollTop:e.pageYOffset}}function $t(t){return bt(At(t)).left+Ut(t).scrollLeft}function Vt(t){var e=wt(t),i=e.overflow,n=e.overflowX,s=e.overflowY;return/auto|scroll|overlay|hidden/.test(i+s+n)}function Kt(t,e){var i;void 0===e&&(e=[]);var n=function t(e){return["html","body","#document"].indexOf(ht(e))>=0?e.ownerDocument.body:ft(e)&&Vt(e)?e:t(Tt(e))}(t),s=n===(null==(i=t.ownerDocument)?void 0:i.body),o=dt(n),r=s?[o].concat(o.visualViewport||[],Vt(n)?n:[]):n,a=e.concat(r);return s?a:a.concat(Kt(Tt(r)))}function Xt(t){return Object.assign({},t,{left:t.x,top:t.y,right:t.x+t.width,bottom:t.y+t.height})}function Yt(t,e){return"viewport"===e?Xt(function(t){var e=dt(t),i=At(t),n=e.visualViewport,s=i.clientWidth,o=i.clientHeight,r=0,a=0;return n&&(s=n.width,o=n.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(r=n.offsetLeft,a=n.offsetTop)),{width:s,height:o,x:r+$t(t),y:a}}(t)):ft(e)?function(t){var e=bt(t);return e.top=e.top+t.clientTop,e.left=e.left+t.clientLeft,e.bottom=e.top+t.clientHeight,e.right=e.left+t.clientWidth,e.width=t.clientWidth,e.height=t.clientHeight,e.x=e.left,e.y=e.top,e}(e):Xt(function(t){var e,i=At(t),n=Ut(t),s=null==(e=t.ownerDocument)?void 0:e.body,o=Lt(i.scrollWidth,i.clientWidth,s?s.scrollWidth:0,s?s.clientWidth:0),r=Lt(i.scrollHeight,i.clientHeight,s?s.scrollHeight:0,s?s.clientHeight:0),a=-n.scrollLeft+$t(t),l=-n.scrollTop;return"rtl"===wt(s||i).direction&&(a+=Lt(i.clientWidth,s?s.clientWidth:0)-o),{width:o,height:r,x:a,y:l}}(At(t)))}function Qt(t){return t.split("-")[1]}function Gt(t){var e,i=t.reference,n=t.element,s=t.placement,o=s?gt(s):null,r=s?Qt(s):null,a=i.x+i.width/2-n.width/2,l=i.y+i.height/2-n.height/2;switch(o){case it:e={x:a,y:i.y-n.height};break;case nt:e={x:a,y:i.y+i.height};break;case st:e={x:i.x+i.width,y:l};break;case ot:e={x:i.x-n.width,y:l};break;default:e={x:i.x,y:i.y}}var c=o?kt(o):null;if(null!=c){var h="y"===c?"height":"width";switch(r){case"start":e[c]=e[c]-(i[h]/2-n[h]/2);break;case"end":e[c]=e[c]+(i[h]/2-n[h]/2)}}return e}function Zt(t,e){void 0===e&&(e={});var i=e,n=i.placement,s=void 0===n?t.placement:n,o=i.boundary,r=void 0===o?"clippingParents":o,a=i.rootBoundary,l=void 0===a?"viewport":a,c=i.elementContext,h=void 0===c?"popper":c,d=i.altBoundary,u=void 0!==d&&d,f=i.padding,p=void 0===f?0:f,m=Nt("number"!=typeof p?p:It(p,rt)),g="popper"===h?"reference":"popper",_=t.elements.reference,b=t.rects.popper,v=t.elements[u?g:h],y=function(t,e,i){var n="clippingParents"===e?function(t){var e=Kt(Tt(t)),i=["absolute","fixed"].indexOf(wt(t).position)>=0&&ft(t)?Ct(t):t;return ut(i)?e.filter((function(t){return ut(t)&&yt(t,i)&&"body"!==ht(t)})):[]}(t):[].concat(e),s=[].concat(n,[i]),o=s[0],r=s.reduce((function(e,i){var n=Yt(t,i);return e.top=Lt(n.top,e.top),e.right=xt(n.right,e.right),e.bottom=xt(n.bottom,e.bottom),e.left=Lt(n.left,e.left),e}),Yt(t,o));return r.width=r.right-r.left,r.height=r.bottom-r.top,r.x=r.left,r.y=r.top,r}(ut(v)?v:v.contextElement||At(t.elements.popper),r,l),w=bt(_),E=Gt({reference:w,element:b,strategy:"absolute",placement:s}),A=Xt(Object.assign({},b,E)),T="popper"===h?A:w,O={top:y.top-T.top+m.top,bottom:T.bottom-y.bottom+m.bottom,left:y.left-T.left+m.left,right:T.right-y.right+m.right},C=t.modifiersData.offset;if("popper"===h&&C){var k=C[s];Object.keys(O).forEach((function(t){var e=[st,nt].indexOf(t)>=0?1:-1,i=[it,nt].indexOf(t)>=0?"y":"x";O[t]+=k[i]*e}))}return O}function Jt(t,e){void 0===e&&(e={});var i=e,n=i.placement,s=i.boundary,o=i.rootBoundary,r=i.padding,a=i.flipVariations,l=i.allowedAutoPlacements,c=void 0===l?lt:l,h=Qt(n),d=h?a?at:at.filter((function(t){return Qt(t)===h})):rt,u=d.filter((function(t){return c.indexOf(t)>=0}));0===u.length&&(u=d);var f=u.reduce((function(e,i){return e[i]=Zt(t,{placement:i,boundary:s,rootBoundary:o,padding:r})[gt(i)],e}),{});return Object.keys(f).sort((function(t,e){return f[t]-f[e]}))}var te={name:"flip",enabled:!0,phase:"main",fn:function(t){var e=t.state,i=t.options,n=t.name;if(!e.modifiersData[n]._skip){for(var s=i.mainAxis,o=void 0===s||s,r=i.altAxis,a=void 0===r||r,l=i.fallbackPlacements,c=i.padding,h=i.boundary,d=i.rootBoundary,u=i.altBoundary,f=i.flipVariations,p=void 0===f||f,m=i.allowedAutoPlacements,g=e.options.placement,_=gt(g),b=l||(_!==g&&p?function(t){if("auto"===gt(t))return[];var e=zt(t);return[Ft(t),e,Ft(e)]}(g):[zt(g)]),v=[g].concat(b).reduce((function(t,i){return t.concat("auto"===gt(i)?Jt(e,{placement:i,boundary:h,rootBoundary:d,padding:c,flipVariations:p,allowedAutoPlacements:m}):i)}),[]),y=e.rects.reference,w=e.rects.popper,E=new Map,A=!0,T=v[0],O=0;O=0,D=x?"width":"height",S=Zt(e,{placement:C,boundary:h,rootBoundary:d,altBoundary:u,padding:c}),N=x?L?st:ot:L?nt:it;y[D]>w[D]&&(N=zt(N));var I=zt(N),P=[];if(o&&P.push(S[k]<=0),a&&P.push(S[N]<=0,S[I]<=0),P.every((function(t){return t}))){T=C,A=!1;break}E.set(C,P)}if(A)for(var j=function(t){var e=v.find((function(e){var i=E.get(e);if(i)return i.slice(0,t).every((function(t){return t}))}));if(e)return T=e,"break"},M=p?3:1;M>0&&"break"!==j(M);M--);e.placement!==T&&(e.modifiersData[n]._skip=!0,e.placement=T,e.reset=!0)}},requiresIfExists:["offset"],data:{_skip:!1}};function ee(t,e,i){return void 0===i&&(i={x:0,y:0}),{top:t.top-e.height-i.y,right:t.right-e.width+i.x,bottom:t.bottom-e.height+i.y,left:t.left-e.width-i.x}}function ie(t){return[it,st,nt,ot].some((function(e){return t[e]>=0}))}var ne={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:function(t){var e=t.state,i=t.name,n=e.rects.reference,s=e.rects.popper,o=e.modifiersData.preventOverflow,r=Zt(e,{elementContext:"reference"}),a=Zt(e,{altBoundary:!0}),l=ee(r,n),c=ee(a,s,o),h=ie(l),d=ie(c);e.modifiersData[i]={referenceClippingOffsets:l,popperEscapeOffsets:c,isReferenceHidden:h,hasPopperEscaped:d},e.attributes.popper=Object.assign({},e.attributes.popper,{"data-popper-reference-hidden":h,"data-popper-escaped":d})}},se={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:function(t){var e=t.state,i=t.options,n=t.name,s=i.offset,o=void 0===s?[0,0]:s,r=lt.reduce((function(t,i){return t[i]=function(t,e,i){var n=gt(t),s=[ot,it].indexOf(n)>=0?-1:1,o="function"==typeof i?i(Object.assign({},e,{placement:t})):i,r=o[0],a=o[1];return r=r||0,a=(a||0)*s,[ot,st].indexOf(n)>=0?{x:a,y:r}:{x:r,y:a}}(i,e.rects,o),t}),{}),a=r[e.placement],l=a.x,c=a.y;null!=e.modifiersData.popperOffsets&&(e.modifiersData.popperOffsets.x+=l,e.modifiersData.popperOffsets.y+=c),e.modifiersData[n]=r}},oe={name:"popperOffsets",enabled:!0,phase:"read",fn:function(t){var e=t.state,i=t.name;e.modifiersData[i]=Gt({reference:e.rects.reference,element:e.rects.popper,strategy:"absolute",placement:e.placement})},data:{}},re={name:"preventOverflow",enabled:!0,phase:"main",fn:function(t){var e=t.state,i=t.options,n=t.name,s=i.mainAxis,o=void 0===s||s,r=i.altAxis,a=void 0!==r&&r,l=i.boundary,c=i.rootBoundary,h=i.altBoundary,d=i.padding,u=i.tether,f=void 0===u||u,p=i.tetherOffset,m=void 0===p?0:p,g=Zt(e,{boundary:l,rootBoundary:c,padding:d,altBoundary:h}),_=gt(e.placement),b=Qt(e.placement),v=!b,y=kt(_),w="x"===y?"y":"x",E=e.modifiersData.popperOffsets,A=e.rects.reference,T=e.rects.popper,O="function"==typeof m?m(Object.assign({},e.rects,{placement:e.placement})):m,C={x:0,y:0};if(E){if(o||a){var k="y"===y?it:ot,L="y"===y?nt:st,x="y"===y?"height":"width",D=E[y],S=E[y]+g[k],N=E[y]-g[L],I=f?-T[x]/2:0,P="start"===b?A[x]:T[x],j="start"===b?-T[x]:-A[x],M=e.elements.arrow,H=f&&M?vt(M):{width:0,height:0},B=e.modifiersData["arrow#persistent"]?e.modifiersData["arrow#persistent"].padding:{top:0,right:0,bottom:0,left:0},R=B[k],W=B[L],z=St(0,A[x],H[x]),q=v?A[x]/2-I-z-R-O:P-z-R-O,F=v?-A[x]/2+I+z+W+O:j+z+W+O,U=e.elements.arrow&&Ct(e.elements.arrow),$=U?"y"===y?U.clientTop||0:U.clientLeft||0:0,V=e.modifiersData.offset?e.modifiersData.offset[e.placement][y]:0,K=E[y]+q-V-$,X=E[y]+F-V;if(o){var Y=St(f?xt(S,K):S,D,f?Lt(N,X):N);E[y]=Y,C[y]=Y-D}if(a){var Q="x"===y?it:ot,G="x"===y?nt:st,Z=E[w],J=Z+g[Q],tt=Z-g[G],et=St(f?xt(J,K):J,Z,f?Lt(tt,X):tt);E[w]=et,C[w]=et-Z}}e.modifiersData[n]=C}},requiresIfExists:["offset"]};function ae(t,e,i){void 0===i&&(i=!1);var n,s,o=ft(e),r=ft(e)&&function(t){var e=t.getBoundingClientRect(),i=e.width/t.offsetWidth||1,n=e.height/t.offsetHeight||1;return 1!==i||1!==n}(e),a=At(e),l=bt(t,r),c={scrollLeft:0,scrollTop:0},h={x:0,y:0};return(o||!o&&!i)&&(("body"!==ht(e)||Vt(a))&&(c=(n=e)!==dt(n)&&ft(n)?{scrollLeft:(s=n).scrollLeft,scrollTop:s.scrollTop}:Ut(n)),ft(e)?((h=bt(e,!0)).x+=e.clientLeft,h.y+=e.clientTop):a&&(h.x=$t(a))),{x:l.left+c.scrollLeft-h.x,y:l.top+c.scrollTop-h.y,width:l.width,height:l.height}}var le={placement:"bottom",modifiers:[],strategy:"absolute"};function ce(){for(var t=arguments.length,e=new Array(t),i=0;iP.on(t,"mouseover",h)),this._element.focus(),this._element.setAttribute("aria-expanded",!0),this._menu.classList.add("show"),this._element.classList.add("show"),P.trigger(this._element,"shown.bs.dropdown",t)}hide(){if(l(this._element)||!this._isShown(this._menu))return;const t={relatedTarget:this._element};this._completeHide(t)}dispose(){this._popper&&this._popper.destroy(),super.dispose()}update(){this._inNavbar=this._detectNavbar(),this._popper&&this._popper.update()}_completeHide(t){P.trigger(this._element,"hide.bs.dropdown",t).defaultPrevented||("ontouchstart"in document.documentElement&&[].concat(...document.body.children).forEach(t=>P.off(t,"mouseover",h)),this._popper&&this._popper.destroy(),this._menu.classList.remove("show"),this._element.classList.remove("show"),this._element.setAttribute("aria-expanded","false"),F.removeDataAttribute(this._menu,"popper"),P.trigger(this._element,"hidden.bs.dropdown",t))}_getConfig(t){if(t={...this.constructor.Default,...F.getDataAttributes(this._element),...t},r("dropdown",t,this.constructor.DefaultType),"object"==typeof t.reference&&!s(t.reference)&&"function"!=typeof t.reference.getBoundingClientRect)throw new TypeError("dropdown".toUpperCase()+': Option "reference" provided type "object" without a required "getBoundingClientRect" method.');return t}_createPopper(t){if(void 0===pe)throw new TypeError("Bootstrap's dropdowns require Popper (https://popper.js.org)");let e=this._element;"parent"===this._config.reference?e=t:s(this._config.reference)?e=o(this._config.reference):"object"==typeof this._config.reference&&(e=this._config.reference);const i=this._getPopperConfig(),n=i.modifiers.find(t=>"applyStyles"===t.name&&!1===t.enabled);this._popper=fe(e,this._menu,i),n&&F.setDataAttribute(this._menu,"popper","static")}_isShown(t=this._element){return t.classList.contains("show")}_getMenuElement(){return U.next(this._element,".dropdown-menu")[0]}_getPlacement(){const t=this._element.parentNode;if(t.classList.contains("dropend"))return ye;if(t.classList.contains("dropstart"))return we;const e="end"===getComputedStyle(this._menu).getPropertyValue("--bs-position").trim();return t.classList.contains("dropup")?e?_e:ge:e?ve:be}_detectNavbar(){return null!==this._element.closest(".navbar")}_getOffset(){const{offset:t}=this._config;return"string"==typeof t?t.split(",").map(t=>Number.parseInt(t,10)):"function"==typeof t?e=>t(e,this._element):t}_getPopperConfig(){const t={placement:this._getPlacement(),modifiers:[{name:"preventOverflow",options:{boundary:this._config.boundary}},{name:"offset",options:{offset:this._getOffset()}}]};return"static"===this._config.display&&(t.modifiers=[{name:"applyStyles",enabled:!1}]),{...t,..."function"==typeof this._config.popperConfig?this._config.popperConfig(t):this._config.popperConfig}}_selectMenuItem({key:t,target:e}){const i=U.find(".dropdown-menu .dropdown-item:not(.disabled):not(:disabled)",this._menu).filter(a);i.length&&b(i,e,"ArrowDown"===t,!i.includes(e)).focus()}static jQueryInterface(t){return this.each((function(){const e=Te.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t]()}}))}static clearMenus(t){if(t&&(2===t.button||"keyup"===t.type&&"Tab"!==t.key))return;const e=U.find('[data-bs-toggle="dropdown"]');for(let i=0,n=e.length;ie+t),this._setElementAttributes(".fixed-top, .fixed-bottom, .is-fixed, .sticky-top","paddingRight",e=>e+t),this._setElementAttributes(".sticky-top","marginRight",e=>e-t)}_disableOverFlow(){this._saveInitialAttribute(this._element,"overflow"),this._element.style.overflow="hidden"}_setElementAttributes(t,e,i){const n=this.getWidth();this._applyManipulationCallback(t,t=>{if(t!==this._element&&window.innerWidth>t.clientWidth+n)return;this._saveInitialAttribute(t,e);const s=window.getComputedStyle(t)[e];t.style[e]=i(Number.parseFloat(s))+"px"})}reset(){this._resetElementAttributes(this._element,"overflow"),this._resetElementAttributes(this._element,"paddingRight"),this._resetElementAttributes(".fixed-top, .fixed-bottom, .is-fixed, .sticky-top","paddingRight"),this._resetElementAttributes(".sticky-top","marginRight")}_saveInitialAttribute(t,e){const i=t.style[e];i&&F.setDataAttribute(t,e,i)}_resetElementAttributes(t,e){this._applyManipulationCallback(t,t=>{const i=F.getDataAttribute(t,e);void 0===i?t.style.removeProperty(e):(F.removeDataAttribute(t,e),t.style[e]=i)})}_applyManipulationCallback(t,e){s(t)?e(t):U.find(t,this._element).forEach(e)}isOverflowing(){return this.getWidth()>0}}const Ce={className:"modal-backdrop",isVisible:!0,isAnimated:!1,rootElement:"body",clickCallback:null},ke={className:"string",isVisible:"boolean",isAnimated:"boolean",rootElement:"(element|string)",clickCallback:"(function|null)"};class Le{constructor(t){this._config=this._getConfig(t),this._isAppended=!1,this._element=null}show(t){this._config.isVisible?(this._append(),this._config.isAnimated&&d(this._getElement()),this._getElement().classList.add("show"),this._emulateAnimation(()=>{g(t)})):g(t)}hide(t){this._config.isVisible?(this._getElement().classList.remove("show"),this._emulateAnimation(()=>{this.dispose(),g(t)})):g(t)}_getElement(){if(!this._element){const t=document.createElement("div");t.className=this._config.className,this._config.isAnimated&&t.classList.add("fade"),this._element=t}return this._element}_getConfig(t){return(t={...Ce,..."object"==typeof t?t:{}}).rootElement=o(t.rootElement),r("backdrop",t,ke),t}_append(){this._isAppended||(this._config.rootElement.append(this._getElement()),P.on(this._getElement(),"mousedown.bs.backdrop",()=>{g(this._config.clickCallback)}),this._isAppended=!0)}dispose(){this._isAppended&&(P.off(this._element,"mousedown.bs.backdrop"),this._element.remove(),this._isAppended=!1)}_emulateAnimation(t){_(t,this._getElement(),this._config.isAnimated)}}const xe={trapElement:null,autofocus:!0},De={trapElement:"element",autofocus:"boolean"};class Se{constructor(t){this._config=this._getConfig(t),this._isActive=!1,this._lastTabNavDirection=null}activate(){const{trapElement:t,autofocus:e}=this._config;this._isActive||(e&&t.focus(),P.off(document,".bs.focustrap"),P.on(document,"focusin.bs.focustrap",t=>this._handleFocusin(t)),P.on(document,"keydown.tab.bs.focustrap",t=>this._handleKeydown(t)),this._isActive=!0)}deactivate(){this._isActive&&(this._isActive=!1,P.off(document,".bs.focustrap"))}_handleFocusin(t){const{target:e}=t,{trapElement:i}=this._config;if(e===document||e===i||i.contains(e))return;const n=U.focusableChildren(i);0===n.length?i.focus():"backward"===this._lastTabNavDirection?n[n.length-1].focus():n[0].focus()}_handleKeydown(t){"Tab"===t.key&&(this._lastTabNavDirection=t.shiftKey?"backward":"forward")}_getConfig(t){return t={...xe,..."object"==typeof t?t:{}},r("focustrap",t,De),t}}const Ne={backdrop:!0,keyboard:!0,focus:!0},Ie={backdrop:"(boolean|string)",keyboard:"boolean",focus:"boolean"};class Pe extends H{constructor(t,e){super(t),this._config=this._getConfig(e),this._dialog=U.findOne(".modal-dialog",this._element),this._backdrop=this._initializeBackDrop(),this._focustrap=this._initializeFocusTrap(),this._isShown=!1,this._ignoreBackdropClick=!1,this._isTransitioning=!1,this._scrollBar=new Oe}static get Default(){return Ne}static get NAME(){return"modal"}toggle(t){return this._isShown?this.hide():this.show(t)}show(t){this._isShown||this._isTransitioning||P.trigger(this._element,"show.bs.modal",{relatedTarget:t}).defaultPrevented||(this._isShown=!0,this._isAnimated()&&(this._isTransitioning=!0),this._scrollBar.hide(),document.body.classList.add("modal-open"),this._adjustDialog(),this._setEscapeEvent(),this._setResizeEvent(),P.on(this._dialog,"mousedown.dismiss.bs.modal",()=>{P.one(this._element,"mouseup.dismiss.bs.modal",t=>{t.target===this._element&&(this._ignoreBackdropClick=!0)})}),this._showBackdrop(()=>this._showElement(t)))}hide(){if(!this._isShown||this._isTransitioning)return;if(P.trigger(this._element,"hide.bs.modal").defaultPrevented)return;this._isShown=!1;const t=this._isAnimated();t&&(this._isTransitioning=!0),this._setEscapeEvent(),this._setResizeEvent(),this._focustrap.deactivate(),this._element.classList.remove("show"),P.off(this._element,"click.dismiss.bs.modal"),P.off(this._dialog,"mousedown.dismiss.bs.modal"),this._queueCallback(()=>this._hideModal(),this._element,t)}dispose(){[window,this._dialog].forEach(t=>P.off(t,".bs.modal")),this._backdrop.dispose(),this._focustrap.deactivate(),super.dispose()}handleUpdate(){this._adjustDialog()}_initializeBackDrop(){return new Le({isVisible:Boolean(this._config.backdrop),isAnimated:this._isAnimated()})}_initializeFocusTrap(){return new Se({trapElement:this._element})}_getConfig(t){return t={...Ne,...F.getDataAttributes(this._element),..."object"==typeof t?t:{}},r("modal",t,Ie),t}_showElement(t){const e=this._isAnimated(),i=U.findOne(".modal-body",this._dialog);this._element.parentNode&&this._element.parentNode.nodeType===Node.ELEMENT_NODE||document.body.append(this._element),this._element.style.display="block",this._element.removeAttribute("aria-hidden"),this._element.setAttribute("aria-modal",!0),this._element.setAttribute("role","dialog"),this._element.scrollTop=0,i&&(i.scrollTop=0),e&&d(this._element),this._element.classList.add("show"),this._queueCallback(()=>{this._config.focus&&this._focustrap.activate(),this._isTransitioning=!1,P.trigger(this._element,"shown.bs.modal",{relatedTarget:t})},this._dialog,e)}_setEscapeEvent(){this._isShown?P.on(this._element,"keydown.dismiss.bs.modal",t=>{this._config.keyboard&&"Escape"===t.key?(t.preventDefault(),this.hide()):this._config.keyboard||"Escape"!==t.key||this._triggerBackdropTransition()}):P.off(this._element,"keydown.dismiss.bs.modal")}_setResizeEvent(){this._isShown?P.on(window,"resize.bs.modal",()=>this._adjustDialog()):P.off(window,"resize.bs.modal")}_hideModal(){this._element.style.display="none",this._element.setAttribute("aria-hidden",!0),this._element.removeAttribute("aria-modal"),this._element.removeAttribute("role"),this._isTransitioning=!1,this._backdrop.hide(()=>{document.body.classList.remove("modal-open"),this._resetAdjustments(),this._scrollBar.reset(),P.trigger(this._element,"hidden.bs.modal")})}_showBackdrop(t){P.on(this._element,"click.dismiss.bs.modal",t=>{this._ignoreBackdropClick?this._ignoreBackdropClick=!1:t.target===t.currentTarget&&(!0===this._config.backdrop?this.hide():"static"===this._config.backdrop&&this._triggerBackdropTransition())}),this._backdrop.show(t)}_isAnimated(){return this._element.classList.contains("fade")}_triggerBackdropTransition(){if(P.trigger(this._element,"hidePrevented.bs.modal").defaultPrevented)return;const{classList:t,scrollHeight:e,style:i}=this._element,n=e>document.documentElement.clientHeight;!n&&"hidden"===i.overflowY||t.contains("modal-static")||(n||(i.overflowY="hidden"),t.add("modal-static"),this._queueCallback(()=>{t.remove("modal-static"),n||this._queueCallback(()=>{i.overflowY=""},this._dialog)},this._dialog),this._element.focus())}_adjustDialog(){const t=this._element.scrollHeight>document.documentElement.clientHeight,e=this._scrollBar.getWidth(),i=e>0;(!i&&t&&!p()||i&&!t&&p())&&(this._element.style.paddingLeft=e+"px"),(i&&!t&&!p()||!i&&t&&p())&&(this._element.style.paddingRight=e+"px")}_resetAdjustments(){this._element.style.paddingLeft="",this._element.style.paddingRight=""}static jQueryInterface(t,e){return this.each((function(){const i=Pe.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===i[t])throw new TypeError(`No method named "${t}"`);i[t](e)}}))}}P.on(document,"click.bs.modal.data-api",'[data-bs-toggle="modal"]',(function(t){const e=i(this);["A","AREA"].includes(this.tagName)&&t.preventDefault(),P.one(e,"show.bs.modal",t=>{t.defaultPrevented||P.one(e,"hidden.bs.modal",()=>{a(this)&&this.focus()})}),Pe.getOrCreateInstance(e).toggle(this)})),B(Pe),m(Pe);const je={backdrop:!0,keyboard:!0,scroll:!1},Me={backdrop:"boolean",keyboard:"boolean",scroll:"boolean"};class He extends H{constructor(t,e){super(t),this._config=this._getConfig(e),this._isShown=!1,this._backdrop=this._initializeBackDrop(),this._focustrap=this._initializeFocusTrap(),this._addEventListeners()}static get NAME(){return"offcanvas"}static get Default(){return je}toggle(t){return this._isShown?this.hide():this.show(t)}show(t){this._isShown||P.trigger(this._element,"show.bs.offcanvas",{relatedTarget:t}).defaultPrevented||(this._isShown=!0,this._element.style.visibility="visible",this._backdrop.show(),this._config.scroll||(new Oe).hide(),this._element.removeAttribute("aria-hidden"),this._element.setAttribute("aria-modal",!0),this._element.setAttribute("role","dialog"),this._element.classList.add("show"),this._queueCallback(()=>{this._config.scroll||this._focustrap.activate(),P.trigger(this._element,"shown.bs.offcanvas",{relatedTarget:t})},this._element,!0))}hide(){this._isShown&&(P.trigger(this._element,"hide.bs.offcanvas").defaultPrevented||(this._focustrap.deactivate(),this._element.blur(),this._isShown=!1,this._element.classList.remove("show"),this._backdrop.hide(),this._queueCallback(()=>{this._element.setAttribute("aria-hidden",!0),this._element.removeAttribute("aria-modal"),this._element.removeAttribute("role"),this._element.style.visibility="hidden",this._config.scroll||(new Oe).reset(),P.trigger(this._element,"hidden.bs.offcanvas")},this._element,!0)))}dispose(){this._backdrop.dispose(),this._focustrap.deactivate(),super.dispose()}_getConfig(t){return t={...je,...F.getDataAttributes(this._element),..."object"==typeof t?t:{}},r("offcanvas",t,Me),t}_initializeBackDrop(){return new Le({className:"offcanvas-backdrop",isVisible:this._config.backdrop,isAnimated:!0,rootElement:this._element.parentNode,clickCallback:()=>this.hide()})}_initializeFocusTrap(){return new Se({trapElement:this._element})}_addEventListeners(){P.on(this._element,"keydown.dismiss.bs.offcanvas",t=>{this._config.keyboard&&"Escape"===t.key&&this.hide()})}static jQueryInterface(t){return this.each((function(){const e=He.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t]||t.startsWith("_")||"constructor"===t)throw new TypeError(`No method named "${t}"`);e[t](this)}}))}}P.on(document,"click.bs.offcanvas.data-api",'[data-bs-toggle="offcanvas"]',(function(t){const e=i(this);if(["A","AREA"].includes(this.tagName)&&t.preventDefault(),l(this))return;P.one(e,"hidden.bs.offcanvas",()=>{a(this)&&this.focus()});const n=U.findOne(".offcanvas.show");n&&n!==e&&He.getInstance(n).hide(),He.getOrCreateInstance(e).toggle(this)})),P.on(window,"load.bs.offcanvas.data-api",()=>U.find(".offcanvas.show").forEach(t=>He.getOrCreateInstance(t).show())),B(He),m(He);const Be=new Set(["background","cite","href","itemtype","longdesc","poster","src","xlink:href"]),Re=/^(?:(?:https?|mailto|ftp|tel|file):|[^#&/:?]*(?:[#/?]|$))/i,We=/^data:(?:image\/(?:bmp|gif|jpeg|jpg|png|tiff|webp)|video\/(?:mpeg|mp4|ogg|webm)|audio\/(?:mp3|oga|ogg|opus));base64,[\d+/a-z]+=*$/i,ze=(t,e)=>{const i=t.nodeName.toLowerCase();if(e.includes(i))return!Be.has(i)||Boolean(Re.test(t.nodeValue)||We.test(t.nodeValue));const n=e.filter(t=>t instanceof RegExp);for(let t=0,e=n.length;t{ze(t,a)||i.removeAttribute(t.nodeName)})}return n.body.innerHTML}const Fe=new Set(["sanitize","allowList","sanitizeFn"]),Ue={animation:"boolean",template:"string",title:"(string|element|function)",trigger:"string",delay:"(number|object)",html:"boolean",selector:"(string|boolean)",placement:"(string|function)",offset:"(array|string|function)",container:"(string|element|boolean)",fallbackPlacements:"array",boundary:"(string|element)",customClass:"(string|function)",sanitize:"boolean",sanitizeFn:"(null|function)",allowList:"object",popperConfig:"(null|object|function)"},$e={AUTO:"auto",TOP:"top",RIGHT:p()?"left":"right",BOTTOM:"bottom",LEFT:p()?"right":"left"},Ve={animation:!0,template:'',trigger:"hover focus",title:"",delay:0,html:!1,selector:!1,placement:"top",offset:[0,0],container:!1,fallbackPlacements:["top","right","bottom","left"],boundary:"clippingParents",customClass:"",sanitize:!0,sanitizeFn:null,allowList:{"*":["class","dir","id","lang","role",/^aria-[\w-]*$/i],a:["target","href","title","rel"],area:[],b:[],br:[],col:[],code:[],div:[],em:[],hr:[],h1:[],h2:[],h3:[],h4:[],h5:[],h6:[],i:[],img:["src","srcset","alt","title","width","height"],li:[],ol:[],p:[],pre:[],s:[],small:[],span:[],sub:[],sup:[],strong:[],u:[],ul:[]},popperConfig:null},Ke={HIDE:"hide.bs.tooltip",HIDDEN:"hidden.bs.tooltip",SHOW:"show.bs.tooltip",SHOWN:"shown.bs.tooltip",INSERTED:"inserted.bs.tooltip",CLICK:"click.bs.tooltip",FOCUSIN:"focusin.bs.tooltip",FOCUSOUT:"focusout.bs.tooltip",MOUSEENTER:"mouseenter.bs.tooltip",MOUSELEAVE:"mouseleave.bs.tooltip"};class Xe extends H{constructor(t,e){if(void 0===pe)throw new TypeError("Bootstrap's tooltips require Popper (https://popper.js.org)");super(t),this._isEnabled=!0,this._timeout=0,this._hoverState="",this._activeTrigger={},this._popper=null,this._config=this._getConfig(e),this.tip=null,this._setListeners()}static get Default(){return Ve}static get NAME(){return"tooltip"}static get Event(){return Ke}static get DefaultType(){return Ue}enable(){this._isEnabled=!0}disable(){this._isEnabled=!1}toggleEnabled(){this._isEnabled=!this._isEnabled}toggle(t){if(this._isEnabled)if(t){const e=this._initializeOnDelegatedTarget(t);e._activeTrigger.click=!e._activeTrigger.click,e._isWithActiveTrigger()?e._enter(null,e):e._leave(null,e)}else{if(this.getTipElement().classList.contains("show"))return void this._leave(null,this);this._enter(null,this)}}dispose(){clearTimeout(this._timeout),P.off(this._element.closest(".modal"),"hide.bs.modal",this._hideModalHandler),this.tip&&this.tip.remove(),this._popper&&this._popper.destroy(),super.dispose()}show(){if("none"===this._element.style.display)throw new Error("Please use show on visible elements");if(!this.isWithContent()||!this._isEnabled)return;const t=P.trigger(this._element,this.constructor.Event.SHOW),e=c(this._element),i=null===e?this._element.ownerDocument.documentElement.contains(this._element):e.contains(this._element);if(t.defaultPrevented||!i)return;const n=this.getTipElement(),s=(t=>{do{t+=Math.floor(1e6*Math.random())}while(document.getElementById(t));return t})(this.constructor.NAME);n.setAttribute("id",s),this._element.setAttribute("aria-describedby",s),this._config.animation&&n.classList.add("fade");const o="function"==typeof this._config.placement?this._config.placement.call(this,n,this._element):this._config.placement,r=this._getAttachment(o);this._addAttachmentClass(r);const{container:a}=this._config;M.set(n,this.constructor.DATA_KEY,this),this._element.ownerDocument.documentElement.contains(this.tip)||(a.append(n),P.trigger(this._element,this.constructor.Event.INSERTED)),this._popper?this._popper.update():this._popper=fe(this._element,n,this._getPopperConfig(r)),n.classList.add("show");const l=this._resolvePossibleFunction(this._config.customClass);l&&n.classList.add(...l.split(" ")),"ontouchstart"in document.documentElement&&[].concat(...document.body.children).forEach(t=>{P.on(t,"mouseover",h)});const d=this.tip.classList.contains("fade");this._queueCallback(()=>{const t=this._hoverState;this._hoverState=null,P.trigger(this._element,this.constructor.Event.SHOWN),"out"===t&&this._leave(null,this)},this.tip,d)}hide(){if(!this._popper)return;const t=this.getTipElement();if(P.trigger(this._element,this.constructor.Event.HIDE).defaultPrevented)return;t.classList.remove("show"),"ontouchstart"in document.documentElement&&[].concat(...document.body.children).forEach(t=>P.off(t,"mouseover",h)),this._activeTrigger.click=!1,this._activeTrigger.focus=!1,this._activeTrigger.hover=!1;const e=this.tip.classList.contains("fade");this._queueCallback(()=>{this._isWithActiveTrigger()||("show"!==this._hoverState&&t.remove(),this._cleanTipClass(),this._element.removeAttribute("aria-describedby"),P.trigger(this._element,this.constructor.Event.HIDDEN),this._popper&&(this._popper.destroy(),this._popper=null))},this.tip,e),this._hoverState=""}update(){null!==this._popper&&this._popper.update()}isWithContent(){return Boolean(this.getTitle())}getTipElement(){if(this.tip)return this.tip;const t=document.createElement("div");t.innerHTML=this._config.template;const e=t.children[0];return this.setContent(e),e.classList.remove("fade","show"),this.tip=e,this.tip}setContent(t){this._sanitizeAndSetContent(t,this.getTitle(),".tooltip-inner")}_sanitizeAndSetContent(t,e,i){const n=U.findOne(i,t);e||!n?this.setElementContent(n,e):n.remove()}setElementContent(t,e){if(null!==t)return s(e)?(e=o(e),void(this._config.html?e.parentNode!==t&&(t.innerHTML="",t.append(e)):t.textContent=e.textContent)):void(this._config.html?(this._config.sanitize&&(e=qe(e,this._config.allowList,this._config.sanitizeFn)),t.innerHTML=e):t.textContent=e)}getTitle(){const t=this._element.getAttribute("data-bs-original-title")||this._config.title;return this._resolvePossibleFunction(t)}updateAttachment(t){return"right"===t?"end":"left"===t?"start":t}_initializeOnDelegatedTarget(t,e){return e||this.constructor.getOrCreateInstance(t.delegateTarget,this._getDelegateConfig())}_getOffset(){const{offset:t}=this._config;return"string"==typeof t?t.split(",").map(t=>Number.parseInt(t,10)):"function"==typeof t?e=>t(e,this._element):t}_resolvePossibleFunction(t){return"function"==typeof t?t.call(this._element):t}_getPopperConfig(t){const e={placement:t,modifiers:[{name:"flip",options:{fallbackPlacements:this._config.fallbackPlacements}},{name:"offset",options:{offset:this._getOffset()}},{name:"preventOverflow",options:{boundary:this._config.boundary}},{name:"arrow",options:{element:`.${this.constructor.NAME}-arrow`}},{name:"onChange",enabled:!0,phase:"afterWrite",fn:t=>this._handlePopperPlacementChange(t)}],onFirstUpdate:t=>{t.options.placement!==t.placement&&this._handlePopperPlacementChange(t)}};return{...e,..."function"==typeof this._config.popperConfig?this._config.popperConfig(e):this._config.popperConfig}}_addAttachmentClass(t){this.getTipElement().classList.add(`${this._getBasicClassPrefix()}-${this.updateAttachment(t)}`)}_getAttachment(t){return $e[t.toUpperCase()]}_setListeners(){this._config.trigger.split(" ").forEach(t=>{if("click"===t)P.on(this._element,this.constructor.Event.CLICK,this._config.selector,t=>this.toggle(t));else if("manual"!==t){const e="hover"===t?this.constructor.Event.MOUSEENTER:this.constructor.Event.FOCUSIN,i="hover"===t?this.constructor.Event.MOUSELEAVE:this.constructor.Event.FOCUSOUT;P.on(this._element,e,this._config.selector,t=>this._enter(t)),P.on(this._element,i,this._config.selector,t=>this._leave(t))}}),this._hideModalHandler=()=>{this._element&&this.hide()},P.on(this._element.closest(".modal"),"hide.bs.modal",this._hideModalHandler),this._config.selector?this._config={...this._config,trigger:"manual",selector:""}:this._fixTitle()}_fixTitle(){const t=this._element.getAttribute("title"),e=typeof this._element.getAttribute("data-bs-original-title");(t||"string"!==e)&&(this._element.setAttribute("data-bs-original-title",t||""),!t||this._element.getAttribute("aria-label")||this._element.textContent||this._element.setAttribute("aria-label",t),this._element.setAttribute("title",""))}_enter(t,e){e=this._initializeOnDelegatedTarget(t,e),t&&(e._activeTrigger["focusin"===t.type?"focus":"hover"]=!0),e.getTipElement().classList.contains("show")||"show"===e._hoverState?e._hoverState="show":(clearTimeout(e._timeout),e._hoverState="show",e._config.delay&&e._config.delay.show?e._timeout=setTimeout(()=>{"show"===e._hoverState&&e.show()},e._config.delay.show):e.show())}_leave(t,e){e=this._initializeOnDelegatedTarget(t,e),t&&(e._activeTrigger["focusout"===t.type?"focus":"hover"]=e._element.contains(t.relatedTarget)),e._isWithActiveTrigger()||(clearTimeout(e._timeout),e._hoverState="out",e._config.delay&&e._config.delay.hide?e._timeout=setTimeout(()=>{"out"===e._hoverState&&e.hide()},e._config.delay.hide):e.hide())}_isWithActiveTrigger(){for(const t in this._activeTrigger)if(this._activeTrigger[t])return!0;return!1}_getConfig(t){const e=F.getDataAttributes(this._element);return Object.keys(e).forEach(t=>{Fe.has(t)&&delete e[t]}),(t={...this.constructor.Default,...e,..."object"==typeof t&&t?t:{}}).container=!1===t.container?document.body:o(t.container),"number"==typeof t.delay&&(t.delay={show:t.delay,hide:t.delay}),"number"==typeof t.title&&(t.title=t.title.toString()),"number"==typeof t.content&&(t.content=t.content.toString()),r("tooltip",t,this.constructor.DefaultType),t.sanitize&&(t.template=qe(t.template,t.allowList,t.sanitizeFn)),t}_getDelegateConfig(){const t={};for(const e in this._config)this.constructor.Default[e]!==this._config[e]&&(t[e]=this._config[e]);return t}_cleanTipClass(){const t=this.getTipElement(),e=new RegExp(`(^|\\s)${this._getBasicClassPrefix()}\\S+`,"g"),i=t.getAttribute("class").match(e);null!==i&&i.length>0&&i.map(t=>t.trim()).forEach(e=>t.classList.remove(e))}_getBasicClassPrefix(){return"bs-tooltip"}_handlePopperPlacementChange(t){const{state:e}=t;e&&(this.tip=e.elements.popper,this._cleanTipClass(),this._addAttachmentClass(this._getAttachment(e.placement)))}static jQueryInterface(t){return this.each((function(){const e=Xe.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t]()}}))}}m(Xe);const Ye={...Xe.Default,placement:"right",offset:[0,8],trigger:"click",content:"",template:''},Qe={...Xe.DefaultType,content:"(string|element|function)"},Ge={HIDE:"hide.bs.popover",HIDDEN:"hidden.bs.popover",SHOW:"show.bs.popover",SHOWN:"shown.bs.popover",INSERTED:"inserted.bs.popover",CLICK:"click.bs.popover",FOCUSIN:"focusin.bs.popover",FOCUSOUT:"focusout.bs.popover",MOUSEENTER:"mouseenter.bs.popover",MOUSELEAVE:"mouseleave.bs.popover"};class Ze extends Xe{static get Default(){return Ye}static get NAME(){return"popover"}static get Event(){return Ge}static get DefaultType(){return Qe}isWithContent(){return this.getTitle()||this._getContent()}setContent(t){this._sanitizeAndSetContent(t,this.getTitle(),".popover-header"),this._sanitizeAndSetContent(t,this._getContent(),".popover-body")}_getContent(){return this._resolvePossibleFunction(this._config.content)}_getBasicClassPrefix(){return"bs-popover"}static jQueryInterface(t){return this.each((function(){const e=Ze.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t]()}}))}}m(Ze);const Je={offset:10,method:"auto",target:""},ti={offset:"number",method:"string",target:"(string|element)"},ei=".nav-link, .list-group-item, .dropdown-item";class ii extends H{constructor(t,e){super(t),this._scrollElement="BODY"===this._element.tagName?window:this._element,this._config=this._getConfig(e),this._offsets=[],this._targets=[],this._activeTarget=null,this._scrollHeight=0,P.on(this._scrollElement,"scroll.bs.scrollspy",()=>this._process()),this.refresh(),this._process()}static get Default(){return Je}static get NAME(){return"scrollspy"}refresh(){const t=this._scrollElement===this._scrollElement.window?"offset":"position",i="auto"===this._config.method?t:this._config.method,n="position"===i?this._getScrollTop():0;this._offsets=[],this._targets=[],this._scrollHeight=this._getScrollHeight(),U.find(ei,this._config.target).map(t=>{const s=e(t),o=s?U.findOne(s):null;if(o){const t=o.getBoundingClientRect();if(t.width||t.height)return[F[i](o).top+n,s]}return null}).filter(t=>t).sort((t,e)=>t[0]-e[0]).forEach(t=>{this._offsets.push(t[0]),this._targets.push(t[1])})}dispose(){P.off(this._scrollElement,".bs.scrollspy"),super.dispose()}_getConfig(t){return(t={...Je,...F.getDataAttributes(this._element),..."object"==typeof t&&t?t:{}}).target=o(t.target)||document.documentElement,r("scrollspy",t,ti),t}_getScrollTop(){return this._scrollElement===window?this._scrollElement.pageYOffset:this._scrollElement.scrollTop}_getScrollHeight(){return this._scrollElement.scrollHeight||Math.max(document.body.scrollHeight,document.documentElement.scrollHeight)}_getOffsetHeight(){return this._scrollElement===window?window.innerHeight:this._scrollElement.getBoundingClientRect().height}_process(){const t=this._getScrollTop()+this._config.offset,e=this._getScrollHeight(),i=this._config.offset+e-this._getOffsetHeight();if(this._scrollHeight!==e&&this.refresh(),t>=i){const t=this._targets[this._targets.length-1];this._activeTarget!==t&&this._activate(t)}else{if(this._activeTarget&&t0)return this._activeTarget=null,void this._clear();for(let e=this._offsets.length;e--;)this._activeTarget!==this._targets[e]&&t>=this._offsets[e]&&(void 0===this._offsets[e+1]||t`${e}[data-bs-target="${t}"],${e}[href="${t}"]`),i=U.findOne(e.join(","),this._config.target);i.classList.add("active"),i.classList.contains("dropdown-item")?U.findOne(".dropdown-toggle",i.closest(".dropdown")).classList.add("active"):U.parents(i,".nav, .list-group").forEach(t=>{U.prev(t,".nav-link, .list-group-item").forEach(t=>t.classList.add("active")),U.prev(t,".nav-item").forEach(t=>{U.children(t,".nav-link").forEach(t=>t.classList.add("active"))})}),P.trigger(this._scrollElement,"activate.bs.scrollspy",{relatedTarget:t})}_clear(){U.find(ei,this._config.target).filter(t=>t.classList.contains("active")).forEach(t=>t.classList.remove("active"))}static jQueryInterface(t){return this.each((function(){const e=ii.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t]()}}))}}P.on(window,"load.bs.scrollspy.data-api",()=>{U.find('[data-bs-spy="scroll"]').forEach(t=>new ii(t))}),m(ii);class ni extends H{static get NAME(){return"tab"}show(){if(this._element.parentNode&&this._element.parentNode.nodeType===Node.ELEMENT_NODE&&this._element.classList.contains("active"))return;let t;const e=i(this._element),n=this._element.closest(".nav, .list-group");if(n){const e="UL"===n.nodeName||"OL"===n.nodeName?":scope > li > .active":".active";t=U.find(e,n),t=t[t.length-1]}const s=t?P.trigger(t,"hide.bs.tab",{relatedTarget:this._element}):null;if(P.trigger(this._element,"show.bs.tab",{relatedTarget:t}).defaultPrevented||null!==s&&s.defaultPrevented)return;this._activate(this._element,n);const o=()=>{P.trigger(t,"hidden.bs.tab",{relatedTarget:this._element}),P.trigger(this._element,"shown.bs.tab",{relatedTarget:t})};e?this._activate(e,e.parentNode,o):o()}_activate(t,e,i){const n=(!e||"UL"!==e.nodeName&&"OL"!==e.nodeName?U.children(e,".active"):U.find(":scope > li > .active",e))[0],s=i&&n&&n.classList.contains("fade"),o=()=>this._transitionComplete(t,n,i);n&&s?(n.classList.remove("show"),this._queueCallback(o,t,!0)):o()}_transitionComplete(t,e,i){if(e){e.classList.remove("active");const t=U.findOne(":scope > .dropdown-menu .active",e.parentNode);t&&t.classList.remove("active"),"tab"===e.getAttribute("role")&&e.setAttribute("aria-selected",!1)}t.classList.add("active"),"tab"===t.getAttribute("role")&&t.setAttribute("aria-selected",!0),d(t),t.classList.contains("fade")&&t.classList.add("show");let n=t.parentNode;if(n&&"LI"===n.nodeName&&(n=n.parentNode),n&&n.classList.contains("dropdown-menu")){const e=t.closest(".dropdown");e&&U.find(".dropdown-toggle",e).forEach(t=>t.classList.add("active")),t.setAttribute("aria-expanded",!0)}i&&i()}static jQueryInterface(t){return this.each((function(){const e=ni.getOrCreateInstance(this);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t]()}}))}}P.on(document,"click.bs.tab.data-api",'[data-bs-toggle="tab"], [data-bs-toggle="pill"], [data-bs-toggle="list"]',(function(t){["A","AREA"].includes(this.tagName)&&t.preventDefault(),l(this)||ni.getOrCreateInstance(this).show()})),m(ni);const si={animation:"boolean",autohide:"boolean",delay:"number"},oi={animation:!0,autohide:!0,delay:5e3};class ri extends H{constructor(t,e){super(t),this._config=this._getConfig(e),this._timeout=null,this._hasMouseInteraction=!1,this._hasKeyboardInteraction=!1,this._setListeners()}static get DefaultType(){return si}static get Default(){return oi}static get NAME(){return"toast"}show(){P.trigger(this._element,"show.bs.toast").defaultPrevented||(this._clearTimeout(),this._config.animation&&this._element.classList.add("fade"),this._element.classList.remove("hide"),d(this._element),this._element.classList.add("show"),this._element.classList.add("showing"),this._queueCallback(()=>{this._element.classList.remove("showing"),P.trigger(this._element,"shown.bs.toast"),this._maybeScheduleHide()},this._element,this._config.animation))}hide(){this._element.classList.contains("show")&&(P.trigger(this._element,"hide.bs.toast").defaultPrevented||(this._element.classList.add("showing"),this._queueCallback(()=>{this._element.classList.add("hide"),this._element.classList.remove("showing"),this._element.classList.remove("show"),P.trigger(this._element,"hidden.bs.toast")},this._element,this._config.animation)))}dispose(){this._clearTimeout(),this._element.classList.contains("show")&&this._element.classList.remove("show"),super.dispose()}_getConfig(t){return t={...oi,...F.getDataAttributes(this._element),..."object"==typeof t&&t?t:{}},r("toast",t,this.constructor.DefaultType),t}_maybeScheduleHide(){this._config.autohide&&(this._hasMouseInteraction||this._hasKeyboardInteraction||(this._timeout=setTimeout(()=>{this.hide()},this._config.delay)))}_onInteraction(t,e){switch(t.type){case"mouseover":case"mouseout":this._hasMouseInteraction=e;break;case"focusin":case"focusout":this._hasKeyboardInteraction=e}if(e)return void this._clearTimeout();const i=t.relatedTarget;this._element===i||this._element.contains(i)||this._maybeScheduleHide()}_setListeners(){P.on(this._element,"mouseover.bs.toast",t=>this._onInteraction(t,!0)),P.on(this._element,"mouseout.bs.toast",t=>this._onInteraction(t,!1)),P.on(this._element,"focusin.bs.toast",t=>this._onInteraction(t,!0)),P.on(this._element,"focusout.bs.toast",t=>this._onInteraction(t,!1))}_clearTimeout(){clearTimeout(this._timeout),this._timeout=null}static jQueryInterface(t){return this.each((function(){const e=ri.getOrCreateInstance(this,t);if("string"==typeof t){if(void 0===e[t])throw new TypeError(`No method named "${t}"`);e[t](this)}}))}}return B(ri),m(ri),{Alert:R,Button:W,Carousel:Z,Collapse:et,Dropdown:Te,Modal:Pe,Offcanvas:He,Popover:Ze,ScrollSpy:ii,Tab:ni,Toast:ri,Tooltip:Xe}})); +//# sourceMappingURL=bootstrap.bundle.min.js.map \ No newline at end of file diff --git a/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js.map b/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js.map new file mode 100644 index 0000000..a59a60b --- /dev/null +++ b/docs/deps/bootstrap-5.1.0/bootstrap.bundle.min.js.map @@ -0,0 +1 @@ +{"version":3,"sources":["../../js/src/util/index.js","../../js/src/dom/event-handler.js","../../js/src/dom/data.js","../../js/src/base-component.js","../../js/src/util/component-functions.js","../../js/src/alert.js","../../js/src/button.js","../../js/src/dom/manipulator.js","../../js/src/dom/selector-engine.js","../../js/src/carousel.js","../../js/src/collapse.js","../../node_modules/@popperjs/core/lib/enums.js","../../node_modules/@popperjs/core/lib/dom-utils/getNodeName.js","../../node_modules/@popperjs/core/lib/dom-utils/getWindow.js","../../node_modules/@popperjs/core/lib/dom-utils/instanceOf.js","../../node_modules/@popperjs/core/lib/modifiers/applyStyles.js","../../node_modules/@popperjs/core/lib/utils/getBasePlacement.js","../../node_modules/@popperjs/core/lib/dom-utils/getBoundingClientRect.js","../../node_modules/@popperjs/core/lib/dom-utils/getLayoutRect.js","../../node_modules/@popperjs/core/lib/dom-utils/contains.js","../../node_modules/@popperjs/core/lib/dom-utils/getComputedStyle.js","../../node_modules/@popperjs/core/lib/dom-utils/isTableElement.js","../../node_modules/@popperjs/core/lib/dom-utils/getDocumentElement.js","../../node_modules/@popperjs/core/lib/dom-utils/getParentNode.js","../../node_modules/@popperjs/core/lib/dom-utils/getOffsetParent.js","../../node_modules/@popperjs/core/lib/utils/getMainAxisFromPlacement.js","../../node_modules/@popperjs/core/lib/utils/math.js","../../node_modules/@popperjs/core/lib/utils/within.js","../../node_modules/@popperjs/core/lib/utils/mergePaddingObject.js","../../node_modules/@popperjs/core/lib/utils/getFreshSideObject.js","../../node_modules/@popperjs/core/lib/utils/expandToHashMap.js","../../node_modules/@popperjs/core/lib/modifiers/arrow.js","../../node_modules/@popperjs/core/lib/modifiers/computeStyles.js","../../node_modules/@popperjs/core/lib/modifiers/eventListeners.js","../../node_modules/@popperjs/core/lib/utils/getOppositePlacement.js","../../node_modules/@popperjs/core/lib/utils/getOppositeVariationPlacement.js","../../node_modules/@popperjs/core/lib/dom-utils/getWindowScroll.js","../../node_modules/@popperjs/core/lib/dom-utils/getWindowScrollBarX.js","../../node_modules/@popperjs/core/lib/dom-utils/isScrollParent.js","../../node_modules/@popperjs/core/lib/dom-utils/listScrollParents.js","../../node_modules/@popperjs/core/lib/dom-utils/getScrollParent.js","../../node_modules/@popperjs/core/lib/utils/rectToClientRect.js","../../node_modules/@popperjs/core/lib/dom-utils/getClippingRect.js","../../node_modules/@popperjs/core/lib/dom-utils/getViewportRect.js","../../node_modules/@popperjs/core/lib/dom-utils/getDocumentRect.js","../../node_modules/@popperjs/core/lib/utils/getVariation.js","../../node_modules/@popperjs/core/lib/utils/computeOffsets.js","../../node_modules/@popperjs/core/lib/utils/detectOverflow.js","../../node_modules/@popperjs/core/lib/utils/computeAutoPlacement.js","../../node_modules/@popperjs/core/lib/modifiers/flip.js","../../node_modules/@popperjs/core/lib/modifiers/hide.js","../../node_modules/@popperjs/core/lib/modifiers/offset.js","../../node_modules/@popperjs/core/lib/modifiers/popperOffsets.js","../../node_modules/@popperjs/core/lib/modifiers/preventOverflow.js","../../node_modules/@popperjs/core/lib/utils/getAltAxis.js","../../node_modules/@popperjs/core/lib/dom-utils/getCompositeRect.js","../../node_modules/@popperjs/core/lib/dom-utils/getNodeScroll.js","../../node_modules/@popperjs/core/lib/dom-utils/getHTMLElementScroll.js","../../node_modules/@popperjs/core/lib/createPopper.js","../../node_modules/@popperjs/core/lib/utils/debounce.js","../../node_modules/@popperjs/core/lib/utils/mergeByName.js","../../node_modules/@popperjs/core/lib/utils/orderModifiers.js","../../node_modules/@popperjs/core/lib/popper-lite.js","../../node_modules/@popperjs/core/lib/popper.js","../../js/src/dropdown.js","../../js/src/util/scrollbar.js","../../js/src/util/backdrop.js","../../js/src/util/focustrap.js","../../js/src/modal.js","../../js/src/offcanvas.js","../../js/src/util/sanitizer.js","../../js/src/tooltip.js","../../js/src/popover.js","../../js/src/scrollspy.js","../../js/src/tab.js","../../js/src/toast.js","../../js/index.umd.js"],"names":["getSelector","element","selector","getAttribute","hrefAttr","includes","startsWith","split","trim","getSelectorFromElement","document","querySelector","getElementFromSelector","triggerTransitionEnd","dispatchEvent","Event","isElement","obj","jquery","nodeType","getElement","length","typeCheckConfig","componentName","config","configTypes","Object","keys","forEach","property","expectedTypes","value","valueType","toString","call","match","toLowerCase","RegExp","test","TypeError","toUpperCase","isVisible","getClientRects","getComputedStyle","getPropertyValue","isDisabled","Node","ELEMENT_NODE","classList","contains","disabled","hasAttribute","findShadowRoot","documentElement","attachShadow","getRootNode","root","ShadowRoot","parentNode","noop","reflow","offsetHeight","getjQuery","jQuery","window","body","DOMContentLoadedCallbacks","isRTL","dir","defineJQueryPlugin","plugin","callback","$","name","NAME","JQUERY_NO_CONFLICT","fn","jQueryInterface","Constructor","noConflict","readyState","addEventListener","push","execute","executeAfterTransition","transitionElement","waitForTransition","emulatedDuration","transitionDuration","transitionDelay","floatTransitionDuration","Number","parseFloat","floatTransitionDelay","getTransitionDurationFromElement","called","handler","target","removeEventListener","setTimeout","getNextActiveElement","list","activeElement","shouldGetNext","isCycleAllowed","index","indexOf","listLength","Math","max","min","namespaceRegex","stripNameRegex","stripUidRegex","eventRegistry","uidEvent","customEvents","mouseenter","mouseleave","customEventsRegex","nativeEvents","Set","getUidEvent","uid","getEvent","findHandler","events","delegationSelector","uidEventList","i","len","event","originalHandler","normalizeParams","originalTypeEvent","delegationFn","delegation","typeEvent","getTypeEvent","has","addHandler","oneOff","wrapFn","relatedTarget","delegateTarget","this","handlers","previousFn","replace","domElements","querySelectorAll","EventHandler","off","type","apply","bootstrapDelegationHandler","bootstrapHandler","removeHandler","Boolean","on","one","inNamespace","isNamespace","elementEvent","namespace","storeElementEvent","handlerKey","removeNamespacedHandlers","slice","keyHandlers","trigger","args","isNative","jQueryEvent","bubbles","nativeDispatch","defaultPrevented","evt","isPropagationStopped","isImmediatePropagationStopped","isDefaultPrevented","createEvent","initEvent","CustomEvent","cancelable","key","defineProperty","get","preventDefault","elementMap","Map","Data","set","instance","instanceMap","size","console","error","Array","from","remove","delete","BaseComponent","constructor","_element","DATA_KEY","dispose","EVENT_KEY","getOwnPropertyNames","propertyName","_queueCallback","isAnimated","[object Object]","getInstance","VERSION","Error","enableDismissTrigger","component","method","clickEvent","tagName","closest","getOrCreateInstance","Alert","close","_destroyElement","each","data","undefined","Button","toggle","setAttribute","normalizeData","val","normalizeDataKey","chr","button","Manipulator","setDataAttribute","removeDataAttribute","removeAttribute","getDataAttributes","attributes","dataset","filter","pureKey","charAt","getDataAttribute","offset","rect","getBoundingClientRect","top","pageYOffset","left","pageXOffset","position","offsetTop","offsetLeft","SelectorEngine","find","concat","Element","prototype","findOne","children","child","matches","parents","ancestor","prev","previous","previousElementSibling","next","nextElementSibling","focusableChildren","focusables","map","join","el","Default","interval","keyboard","slide","pause","wrap","touch","DefaultType","ORDER_NEXT","ORDER_PREV","DIRECTION_LEFT","DIRECTION_RIGHT","KEY_TO_DIRECTION","ArrowLeft","ArrowRight","Carousel","super","_items","_interval","_activeElement","_isPaused","_isSliding","touchTimeout","touchStartX","touchDeltaX","_config","_getConfig","_indicatorsElement","_touchSupported","navigator","maxTouchPoints","_pointerEvent","PointerEvent","_addEventListeners","_slide","nextWhenVisible","hidden","cycle","clearInterval","_updateInterval","setInterval","visibilityState","bind","to","activeIndex","_getItemIndex","order","_handleSwipe","absDeltax","abs","direction","_keydown","_addTouchEventListeners","start","pointerType","touches","clientX","move","end","clearTimeout","itemImg","e","add","_getItemByOrder","isNext","_triggerSlideEvent","eventDirectionName","targetIndex","fromIndex","_setActiveIndicatorElement","activeIndicator","indicators","parseInt","elementInterval","defaultInterval","directionOrOrder","_directionToOrder","activeElementIndex","nextElement","nextElementIndex","isCycling","directionalClassName","orderClassName","_orderToDirection","triggerSlidEvent","completeCallBack","action","ride","carouselInterface","slideIndex","dataApiClickHandler","carousels","parent","Collapse","_isTransitioning","_triggerArray","toggleList","elem","filterElement","foundElem","_selector","_initializeChildren","_addAriaAndCollapsedClass","_isShown","hide","show","activesData","actives","container","tempActiveData","elemActive","dimension","_getDimension","style","scrollSize","triggerArrayLength","selected","triggerArray","isOpen","bottom","right","basePlacements","variationPlacements","reduce","acc","placement","placements","modifierPhases","getNodeName","nodeName","getWindow","node","ownerDocument","defaultView","isHTMLElement","HTMLElement","isShadowRoot","applyStyles$1","enabled","phase","_ref","state","elements","styles","assign","effect","_ref2","initialStyles","popper","options","strategy","margin","arrow","reference","hasOwnProperty","attribute","requires","getBasePlacement","round","includeScale","scaleX","scaleY","width","offsetWidth","height","x","y","getLayoutRect","clientRect","rootNode","isSameNode","host","isTableElement","getDocumentElement","getParentNode","assignedSlot","getTrueOffsetParent","offsetParent","getOffsetParent","isFirefox","userAgent","currentNode","css","transform","perspective","contain","willChange","getContainingBlock","getMainAxisFromPlacement","within","mathMax","mathMin","mergePaddingObject","paddingObject","expandToHashMap","hashMap","arrow$1","_state$modifiersData$","arrowElement","popperOffsets","modifiersData","basePlacement","axis","padding","rects","toPaddingObject","arrowRect","minProp","maxProp","endDiff","startDiff","arrowOffsetParent","clientSize","clientHeight","clientWidth","centerToReference","center","axisProp","centerOffset","_options$element","requiresIfExists","unsetSides","mapToStyles","_Object$assign2","popperRect","offsets","gpuAcceleration","adaptive","roundOffsets","_ref3","dpr","devicePixelRatio","roundOffsetsByDPR","_ref3$x","_ref3$y","hasX","hasY","sideX","sideY","win","heightProp","widthProp","_Object$assign","commonStyles","computeStyles$1","_ref4","_options$gpuAccelerat","_options$adaptive","_options$roundOffsets","data-popper-placement","passive","eventListeners","_options$scroll","scroll","_options$resize","resize","scrollParents","scrollParent","update","hash","getOppositePlacement","matched","getOppositeVariationPlacement","getWindowScroll","scrollLeft","scrollTop","getWindowScrollBarX","isScrollParent","_getComputedStyle","overflow","overflowX","overflowY","listScrollParents","_element$ownerDocumen","getScrollParent","isBody","visualViewport","updatedList","rectToClientRect","getClientRectFromMixedType","clippingParent","html","getViewportRect","clientTop","clientLeft","getInnerBoundingClientRect","winScroll","scrollWidth","scrollHeight","getDocumentRect","getVariation","computeOffsets","variation","commonX","commonY","mainAxis","detectOverflow","_options","_options$placement","_options$boundary","boundary","_options$rootBoundary","rootBoundary","_options$elementConte","elementContext","_options$altBoundary","altBoundary","_options$padding","altContext","referenceElement","clippingClientRect","mainClippingParents","clippingParents","clipperElement","getClippingParents","firstClippingParent","clippingRect","accRect","getClippingRect","contextElement","referenceClientRect","popperClientRect","elementClientRect","overflowOffsets","offsetData","multiply","computeAutoPlacement","flipVariations","_options$allowedAutoP","allowedAutoPlacements","allPlacements","allowedPlacements","overflows","sort","a","b","flip$1","_skip","_options$mainAxis","checkMainAxis","_options$altAxis","altAxis","checkAltAxis","specifiedFallbackPlacements","fallbackPlacements","_options$flipVariatio","preferredPlacement","oppositePlacement","getExpandedFallbackPlacements","referenceRect","checksMap","makeFallbackChecks","firstFittingPlacement","_basePlacement","isStartVariation","isVertical","mainVariationSide","altVariationSide","checks","every","check","_loop","_i","fittingPlacement","reset","getSideOffsets","preventedOffsets","isAnySideFullyClipped","some","side","hide$1","preventOverflow","referenceOverflow","popperAltOverflow","referenceClippingOffsets","popperEscapeOffsets","isReferenceHidden","hasPopperEscaped","data-popper-reference-hidden","data-popper-escaped","offset$1","_options$offset","invertDistance","skidding","distance","distanceAndSkiddingToXY","_data$state$placement","popperOffsets$1","preventOverflow$1","_options$tether","tether","_options$tetherOffset","tetherOffset","isBasePlacement","tetherOffsetValue","mainSide","altSide","additive","minLen","maxLen","arrowPaddingObject","arrowPaddingMin","arrowPaddingMax","arrowLen","minOffset","maxOffset","clientOffset","offsetModifierValue","tetherMin","tetherMax","preventedOffset","_mainSide","_altSide","_offset","_min","_max","_preventedOffset","getCompositeRect","elementOrVirtualElement","isFixed","isOffsetParentAnElement","offsetParentIsScaled","isElementScaled","DEFAULT_OPTIONS","modifiers","areValidElements","_len","arguments","_key","popperGenerator","generatorOptions","_generatorOptions","_generatorOptions$def","defaultModifiers","_generatorOptions$def2","defaultOptions","pending","orderedModifiers","effectCleanupFns","isDestroyed","setOptions","cleanupModifierEffects","merged","visited","result","modifier","dep","depModifier","orderModifiers","current","existing","m","_ref3$options","cleanupFn","forceUpdate","_state$elements","_state$orderedModifie","_state$orderedModifie2","Promise","resolve","then","destroy","onFirstUpdate","createPopper","computeStyles","applyStyles","flip","REGEXP_KEYDOWN","PLACEMENT_TOP","PLACEMENT_TOPEND","PLACEMENT_BOTTOM","PLACEMENT_BOTTOMEND","PLACEMENT_RIGHT","PLACEMENT_LEFT","display","popperConfig","autoClose","Dropdown","_popper","_menu","_getMenuElement","_inNavbar","_detectNavbar","getParentFromElement","_createPopper","focus","_completeHide","Popper","_getPopperConfig","isDisplayStatic","_getPlacement","parentDropdown","isEnd","_getOffset","popperData","defaultBsPopperConfig","_selectMenuItem","items","toggles","context","composedPath","isMenuTarget","isActive","stopPropagation","getToggleButton","clearMenus","dataApiKeydownHandler","ScrollBarHelper","getWidth","documentWidth","innerWidth","_disableOverFlow","_setElementAttributes","calculatedValue","_saveInitialAttribute","styleProp","scrollbarWidth","_applyManipulationCallback","_resetElementAttributes","actualValue","removeProperty","callBack","isOverflowing","className","rootElement","clickCallback","Backdrop","_isAppended","_append","_getElement","_emulateAnimation","backdrop","createElement","append","trapElement","autofocus","FocusTrap","_isActive","_lastTabNavDirection","activate","_handleFocusin","_handleKeydown","deactivate","shiftKey","Modal","_dialog","_backdrop","_initializeBackDrop","_focustrap","_initializeFocusTrap","_ignoreBackdropClick","_scrollBar","_isAnimated","_adjustDialog","_setEscapeEvent","_setResizeEvent","_showBackdrop","_showElement","_hideModal","htmlElement","handleUpdate","modalBody","_triggerBackdropTransition","_resetAdjustments","currentTarget","isModalOverflowing","isBodyOverflowing","paddingLeft","paddingRight","showEvent","Offcanvas","visibility","blur","allReadyOpen","uriAttrs","SAFE_URL_PATTERN","DATA_URL_PATTERN","allowedAttribute","attr","allowedAttributeList","attrName","nodeValue","regExp","attrRegex","sanitizeHtml","unsafeHtml","allowList","sanitizeFn","createdDocument","DOMParser","parseFromString","allowlistKeys","elName","attributeList","allowedAttributes","innerHTML","DISALLOWED_ATTRIBUTES","animation","template","title","delay","customClass","sanitize","AttachmentMap","AUTO","TOP","RIGHT","BOTTOM","LEFT","*","area","br","col","code","div","em","hr","h1","h2","h3","h4","h5","h6","img","li","ol","p","pre","s","small","span","sub","sup","strong","u","ul","HIDE","HIDDEN","SHOW","SHOWN","INSERTED","CLICK","FOCUSIN","FOCUSOUT","MOUSEENTER","MOUSELEAVE","Tooltip","_isEnabled","_timeout","_hoverState","_activeTrigger","tip","_setListeners","enable","disable","toggleEnabled","_initializeOnDelegatedTarget","click","_isWithActiveTrigger","_enter","_leave","getTipElement","_hideModalHandler","isWithContent","shadowRoot","isInTheDom","tipId","prefix","floor","random","getElementById","getUID","attachment","_getAttachment","_addAttachmentClass","_resolvePossibleFunction","prevHoverState","_cleanTipClass","getTitle","setContent","_sanitizeAndSetContent","content","templateElement","setElementContent","textContent","updateAttachment","_getDelegateConfig","_handlePopperPlacementChange","_getBasicClassPrefix","eventIn","eventOut","_fixTitle","originalTitleType","dataAttributes","dataAttr","basicClassPrefixRegex","tabClass","token","tClass","Popover","_getContent","SELECTOR_LINK_ITEMS","ScrollSpy","_scrollElement","_offsets","_targets","_activeTarget","_scrollHeight","_process","refresh","autoMethod","offsetMethod","offsetBase","_getScrollTop","_getScrollHeight","targetSelector","targetBCR","item","_getOffsetHeight","innerHeight","maxScroll","_activate","_clear","queries","link","listGroup","navItem","spy","Tab","listElement","itemSelector","hideEvent","complete","active","isTransitioning","_transitionComplete","dropdownChild","dropdownElement","dropdown","autohide","Toast","_hasMouseInteraction","_hasKeyboardInteraction","_clearTimeout","_maybeScheduleHide","_onInteraction","isInteracting"],"mappings":";;;;;0OAOA,MA2BMA,EAAcC,IAClB,IAAIC,EAAWD,EAAQE,aAAa,kBAEpC,IAAKD,GAAyB,MAAbA,EAAkB,CACjC,IAAIE,EAAWH,EAAQE,aAAa,QAMpC,IAAKC,IAAcA,EAASC,SAAS,OAASD,EAASE,WAAW,KAChE,OAAO,KAILF,EAASC,SAAS,OAASD,EAASE,WAAW,OACjDF,EAAY,IAAGA,EAASG,MAAM,KAAK,IAGrCL,EAAWE,GAAyB,MAAbA,EAAmBA,EAASI,OAAS,KAG9D,OAAON,GAGHO,EAAyBR,IAC7B,MAAMC,EAAWF,EAAYC,GAE7B,OAAIC,GACKQ,SAASC,cAAcT,GAAYA,EAGrC,MAGHU,EAAyBX,IAC7B,MAAMC,EAAWF,EAAYC,GAE7B,OAAOC,EAAWQ,SAASC,cAAcT,GAAY,MA0BjDW,EAAuBZ,IAC3BA,EAAQa,cAAc,IAAIC,MA1FL,mBA6FjBC,EAAYC,MACXA,GAAsB,iBAARA,UAIO,IAAfA,EAAIC,SACbD,EAAMA,EAAI,SAGmB,IAAjBA,EAAIE,UAGdC,EAAaH,GACbD,EAAUC,GACLA,EAAIC,OAASD,EAAI,GAAKA,EAGZ,iBAARA,GAAoBA,EAAII,OAAS,EACnCX,SAASC,cAAcM,GAGzB,KAGHK,EAAkB,CAACC,EAAeC,EAAQC,KAC9CC,OAAOC,KAAKF,GAAaG,QAAQC,IAC/B,MAAMC,EAAgBL,EAAYI,GAC5BE,EAAQP,EAAOK,GACfG,EAAYD,GAASf,EAAUe,GAAS,UArH5Cd,OADSA,EAsHsDc,GApHzD,GAAEd,EAGL,GAAGgB,SAASC,KAAKjB,GAAKkB,MAAM,eAAe,GAAGC,cALxCnB,IAAAA,EAwHX,IAAK,IAAIoB,OAAOP,GAAeQ,KAAKN,GAClC,MAAM,IAAIO,UACP,GAAEhB,EAAciB,0BAA0BX,qBAA4BG,yBAAiCF,UAM1GW,EAAYxC,MACXe,EAAUf,IAAgD,IAApCA,EAAQyC,iBAAiBrB,SAIgB,YAA7DsB,iBAAiB1C,GAAS2C,iBAAiB,cAG9CC,EAAa5C,IACZA,GAAWA,EAAQkB,WAAa2B,KAAKC,gBAItC9C,EAAQ+C,UAAUC,SAAS,mBAIC,IAArBhD,EAAQiD,SACVjD,EAAQiD,SAGVjD,EAAQkD,aAAa,aAAoD,UAArClD,EAAQE,aAAa,aAG5DiD,EAAiBnD,IACrB,IAAKS,SAAS2C,gBAAgBC,aAC5B,OAAO,KAIT,GAAmC,mBAAxBrD,EAAQsD,YAA4B,CAC7C,MAAMC,EAAOvD,EAAQsD,cACrB,OAAOC,aAAgBC,WAAaD,EAAO,KAG7C,OAAIvD,aAAmBwD,WACdxD,EAIJA,EAAQyD,WAINN,EAAenD,EAAQyD,YAHrB,MAMLC,EAAO,OAUPC,EAAS3D,IAEbA,EAAQ4D,cAGJC,EAAY,KAChB,MAAMC,OAAEA,GAAWC,OAEnB,OAAID,IAAWrD,SAASuD,KAAKd,aAAa,qBACjCY,EAGF,MAGHG,EAA4B,GAiB5BC,EAAQ,IAAuC,QAAjCzD,SAAS2C,gBAAgBe,IAEvCC,EAAqBC,IAjBAC,IAAAA,EAAAA,EAkBN,KACjB,MAAMC,EAAIV,IAEV,GAAIU,EAAG,CACL,MAAMC,EAAOH,EAAOI,KACdC,EAAqBH,EAAEI,GAAGH,GAChCD,EAAEI,GAAGH,GAAQH,EAAOO,gBACpBL,EAAEI,GAAGH,GAAMK,YAAcR,EACzBE,EAAEI,GAAGH,GAAMM,WAAa,KACtBP,EAAEI,GAAGH,GAAQE,EACNL,EAAOO,mBA3BQ,YAAxBnE,SAASsE,YAENd,EAA0B7C,QAC7BX,SAASuE,iBAAiB,mBAAoB,KAC5Cf,EAA0BtC,QAAQ2C,GAAYA,OAIlDL,EAA0BgB,KAAKX,IAE/BA,KAuBEY,EAAUZ,IACU,mBAAbA,GACTA,KAIEa,EAAyB,CAACb,EAAUc,EAAmBC,GAAoB,KAC/E,IAAKA,EAEH,YADAH,EAAQZ,GAIV,MACMgB,EA1LiCtF,CAAAA,IACvC,IAAKA,EACH,OAAO,EAIT,IAAIuF,mBAAEA,EAAFC,gBAAsBA,GAAoBzB,OAAOrB,iBAAiB1C,GAEtE,MAAMyF,EAA0BC,OAAOC,WAAWJ,GAC5CK,EAAuBF,OAAOC,WAAWH,GAG/C,OAAKC,GAA4BG,GAKjCL,EAAqBA,EAAmBjF,MAAM,KAAK,GACnDkF,EAAkBA,EAAgBlF,MAAM,KAAK,GArFf,KAuFtBoF,OAAOC,WAAWJ,GAAsBG,OAAOC,WAAWH,KAPzD,GA6KgBK,CAAiCT,GADlC,EAGxB,IAAIU,GAAS,EAEb,MAAMC,EAAU,EAAGC,OAAAA,MACbA,IAAWZ,IAIfU,GAAS,EACTV,EAAkBa,oBAtQC,gBAsQmCF,GACtDb,EAAQZ,KAGVc,EAAkBJ,iBA1QG,gBA0Q8Be,GACnDG,WAAW,KACJJ,GACHlF,EAAqBwE,IAEtBE,IAYCa,EAAuB,CAACC,EAAMC,EAAeC,EAAeC,KAChE,IAAIC,EAAQJ,EAAKK,QAAQJ,GAGzB,IAAe,IAAXG,EACF,OAAOJ,GAAME,GAAiBC,EAAiBH,EAAKhF,OAAS,EAAI,GAGnE,MAAMsF,EAAaN,EAAKhF,OAQxB,OANAoF,GAASF,EAAgB,GAAK,EAE1BC,IACFC,GAASA,EAAQE,GAAcA,GAG1BN,EAAKO,KAAKC,IAAI,EAAGD,KAAKE,IAAIL,EAAOE,EAAa,MCrSjDI,EAAiB,qBACjBC,EAAiB,OACjBC,EAAgB,SAChBC,EAAgB,GACtB,IAAIC,EAAW,EACf,MAAMC,EAAe,CACnBC,WAAY,YACZC,WAAY,YAERC,EAAoB,4BACpBC,EAAe,IAAIC,IAAI,CAC3B,QACA,WACA,UACA,YACA,cACA,aACA,iBACA,YACA,WACA,YACA,cACA,YACA,UACA,WACA,QACA,oBACA,aACA,YACA,WACA,cACA,cACA,cACA,YACA,eACA,gBACA,eACA,gBACA,aACA,QACA,OACA,SACA,QACA,SACA,SACA,UACA,WACA,OACA,SACA,eACA,SACA,OACA,mBACA,mBACA,QACA,QACA,WASF,SAASC,EAAYzH,EAAS0H,GAC5B,OAAQA,GAAQ,GAAEA,MAAQR,OAAiBlH,EAAQkH,UAAYA,IAGjE,SAASS,EAAS3H,GAChB,MAAM0H,EAAMD,EAAYzH,GAKxB,OAHAA,EAAQkH,SAAWQ,EACnBT,EAAcS,GAAOT,EAAcS,IAAQ,GAEpCT,EAAcS,GAuCvB,SAASE,EAAYC,EAAQ9B,EAAS+B,EAAqB,MACzD,MAAMC,EAAetG,OAAOC,KAAKmG,GAEjC,IAAK,IAAIG,EAAI,EAAGC,EAAMF,EAAa3G,OAAQ4G,EAAIC,EAAKD,IAAK,CACvD,MAAME,EAAQL,EAAOE,EAAaC,IAElC,GAAIE,EAAMC,kBAAoBpC,GAAWmC,EAAMJ,qBAAuBA,EACpE,OAAOI,EAIX,OAAO,KAGT,SAASE,EAAgBC,EAAmBtC,EAASuC,GACnD,MAAMC,EAAgC,iBAAZxC,EACpBoC,EAAkBI,EAAaD,EAAevC,EAEpD,IAAIyC,EAAYC,EAAaJ,GAO7B,OANiBd,EAAamB,IAAIF,KAGhCA,EAAYH,GAGP,CAACE,EAAYJ,EAAiBK,GAGvC,SAASG,EAAW3I,EAASqI,EAAmBtC,EAASuC,EAAcM,GACrE,GAAiC,iBAAtBP,IAAmCrI,EAC5C,OAUF,GAPK+F,IACHA,EAAUuC,EACVA,EAAe,MAKbhB,EAAkBjF,KAAKgG,GAAoB,CAC7C,MAAMQ,EAASlE,GACN,SAAUuD,GACf,IAAKA,EAAMY,eAAkBZ,EAAMY,gBAAkBZ,EAAMa,iBAAmBb,EAAMa,eAAe/F,SAASkF,EAAMY,eAChH,OAAOnE,EAAG1C,KAAK+G,KAAMd,IAKvBI,EACFA,EAAeO,EAAOP,GAEtBvC,EAAU8C,EAAO9C,GAIrB,MAAOwC,EAAYJ,EAAiBK,GAAaJ,EAAgBC,EAAmBtC,EAASuC,GACvFT,EAASF,EAAS3H,GAClBiJ,EAAWpB,EAAOW,KAAeX,EAAOW,GAAa,IACrDU,EAAatB,EAAYqB,EAAUd,EAAiBI,EAAaxC,EAAU,MAEjF,GAAImD,EAGF,YAFAA,EAAWN,OAASM,EAAWN,QAAUA,GAK3C,MAAMlB,EAAMD,EAAYU,EAAiBE,EAAkBc,QAAQrC,EAAgB,KAC7EnC,EAAK4D,EA5Fb,SAAoCvI,EAASC,EAAU0E,GACrD,OAAO,SAASoB,EAAQmC,GACtB,MAAMkB,EAAcpJ,EAAQqJ,iBAAiBpJ,GAE7C,IAAK,IAAI+F,OAAEA,GAAWkC,EAAOlC,GAAUA,IAAWgD,KAAMhD,EAASA,EAAOvC,WACtE,IAAK,IAAIuE,EAAIoB,EAAYhI,OAAQ4G,KAC/B,GAAIoB,EAAYpB,KAAOhC,EAQrB,OAPAkC,EAAMa,eAAiB/C,EAEnBD,EAAQ6C,QAEVU,EAAaC,IAAIvJ,EAASkI,EAAMsB,KAAMvJ,EAAU0E,GAG3CA,EAAG8E,MAAMzD,EAAQ,CAACkC,IAM/B,OAAO,MAyEPwB,CAA2B1J,EAAS+F,EAASuC,GAzGjD,SAA0BtI,EAAS2E,GACjC,OAAO,SAASoB,EAAQmC,GAOtB,OANAA,EAAMa,eAAiB/I,EAEnB+F,EAAQ6C,QACVU,EAAaC,IAAIvJ,EAASkI,EAAMsB,KAAM7E,GAGjCA,EAAG8E,MAAMzJ,EAAS,CAACkI,KAkG1ByB,CAAiB3J,EAAS+F,GAE5BpB,EAAGmD,mBAAqBS,EAAaxC,EAAU,KAC/CpB,EAAGwD,gBAAkBA,EACrBxD,EAAGiE,OAASA,EACZjE,EAAGuC,SAAWQ,EACduB,EAASvB,GAAO/C,EAEhB3E,EAAQgF,iBAAiBwD,EAAW7D,EAAI4D,GAG1C,SAASqB,EAAc5J,EAAS6H,EAAQW,EAAWzC,EAAS+B,GAC1D,MAAMnD,EAAKiD,EAAYC,EAAOW,GAAYzC,EAAS+B,GAE9CnD,IAIL3E,EAAQiG,oBAAoBuC,EAAW7D,EAAIkF,QAAQ/B,WAC5CD,EAAOW,GAAW7D,EAAGuC,WAe9B,SAASuB,EAAaP,GAGpB,OADAA,EAAQA,EAAMiB,QAAQpC,EAAgB,IAC/BI,EAAae,IAAUA,EAGhC,MAAMoB,EAAe,CACnBQ,GAAG9J,EAASkI,EAAOnC,EAASuC,GAC1BK,EAAW3I,EAASkI,EAAOnC,EAASuC,GAAc,IAGpDyB,IAAI/J,EAASkI,EAAOnC,EAASuC,GAC3BK,EAAW3I,EAASkI,EAAOnC,EAASuC,GAAc,IAGpDiB,IAAIvJ,EAASqI,EAAmBtC,EAASuC,GACvC,GAAiC,iBAAtBD,IAAmCrI,EAC5C,OAGF,MAAOuI,EAAYJ,EAAiBK,GAAaJ,EAAgBC,EAAmBtC,EAASuC,GACvF0B,EAAcxB,IAAcH,EAC5BR,EAASF,EAAS3H,GAClBiK,EAAc5B,EAAkBhI,WAAW,KAEjD,QAA+B,IAApB8H,EAAiC,CAE1C,IAAKN,IAAWA,EAAOW,GACrB,OAIF,YADAoB,EAAc5J,EAAS6H,EAAQW,EAAWL,EAAiBI,EAAaxC,EAAU,MAIhFkE,GACFxI,OAAOC,KAAKmG,GAAQlG,QAAQuI,KAhDlC,SAAkClK,EAAS6H,EAAQW,EAAW2B,GAC5D,MAAMC,EAAoBvC,EAAOW,IAAc,GAE/C/G,OAAOC,KAAK0I,GAAmBzI,QAAQ0I,IACrC,GAAIA,EAAWjK,SAAS+J,GAAY,CAClC,MAAMjC,EAAQkC,EAAkBC,GAEhCT,EAAc5J,EAAS6H,EAAQW,EAAWN,EAAMC,gBAAiBD,EAAMJ,uBA0CrEwC,CAAyBtK,EAAS6H,EAAQqC,EAAc7B,EAAkBkC,MAAM,MAIpF,MAAMH,EAAoBvC,EAAOW,IAAc,GAC/C/G,OAAOC,KAAK0I,GAAmBzI,QAAQ6I,IACrC,MAAMH,EAAaG,EAAYrB,QAAQnC,EAAe,IAEtD,IAAKgD,GAAe3B,EAAkBjI,SAASiK,GAAa,CAC1D,MAAMnC,EAAQkC,EAAkBI,GAEhCZ,EAAc5J,EAAS6H,EAAQW,EAAWN,EAAMC,gBAAiBD,EAAMJ,wBAK7E2C,QAAQzK,EAASkI,EAAOwC,GACtB,GAAqB,iBAAVxC,IAAuBlI,EAChC,OAAO,KAGT,MAAMuE,EAAIV,IACJ2E,EAAYC,EAAaP,GACzB8B,EAAc9B,IAAUM,EACxBmC,EAAWpD,EAAamB,IAAIF,GAElC,IAAIoC,EACAC,GAAU,EACVC,GAAiB,EACjBC,GAAmB,EACnBC,EAAM,KA4CV,OA1CIhB,GAAezF,IACjBqG,EAAcrG,EAAEzD,MAAMoH,EAAOwC,GAE7BnG,EAAEvE,GAASyK,QAAQG,GACnBC,GAAWD,EAAYK,uBACvBH,GAAkBF,EAAYM,gCAC9BH,EAAmBH,EAAYO,sBAG7BR,GACFK,EAAMvK,SAAS2K,YAAY,cAC3BJ,EAAIK,UAAU7C,EAAWqC,GAAS,IAElCG,EAAM,IAAIM,YAAYpD,EAAO,CAC3B2C,QAAAA,EACAU,YAAY,SAKI,IAATb,GACTjJ,OAAOC,KAAKgJ,GAAM/I,QAAQ6J,IACxB/J,OAAOgK,eAAeT,EAAKQ,EAAK,CAC9BE,IAAG,IACMhB,EAAKc,OAMhBT,GACFC,EAAIW,iBAGFb,GACF9K,EAAQa,cAAcmK,GAGpBA,EAAID,uBAA2C,IAAhBH,GACjCA,EAAYe,iBAGPX,IC3ULY,EAAa,IAAIC,IAEvB,IAAAC,EAAe,CACbC,IAAI/L,EAASwL,EAAKQ,GACXJ,EAAWlD,IAAI1I,IAClB4L,EAAWG,IAAI/L,EAAS,IAAI6L,KAG9B,MAAMI,EAAcL,EAAWF,IAAI1L,GAI9BiM,EAAYvD,IAAI8C,IAA6B,IAArBS,EAAYC,KAMzCD,EAAYF,IAAIP,EAAKQ,GAJnBG,QAAQC,MAAO,+EAA8EC,MAAMC,KAAKL,EAAYvK,QAAQ,QAOhIgK,IAAG,CAAC1L,EAASwL,IACPI,EAAWlD,IAAI1I,IACV4L,EAAWF,IAAI1L,GAAS0L,IAAIF,IAG9B,KAGTe,OAAOvM,EAASwL,GACd,IAAKI,EAAWlD,IAAI1I,GAClB,OAGF,MAAMiM,EAAcL,EAAWF,IAAI1L,GAEnCiM,EAAYO,OAAOhB,GAGM,IAArBS,EAAYC,MACdN,EAAWY,OAAOxM,KC/BxB,MAAMyM,EACJC,YAAY1M,IACVA,EAAUmB,EAAWnB,MAMrBgJ,KAAK2D,SAAW3M,EAChB8L,EAAKC,IAAI/C,KAAK2D,SAAU3D,KAAK0D,YAAYE,SAAU5D,OAGrD6D,UACEf,EAAKS,OAAOvD,KAAK2D,SAAU3D,KAAK0D,YAAYE,UAC5CtD,EAAaC,IAAIP,KAAK2D,SAAU3D,KAAK0D,YAAYI,WAEjDrL,OAAOsL,oBAAoB/D,MAAMrH,QAAQqL,IACvChE,KAAKgE,GAAgB,OAIzBC,eAAe3I,EAAUtE,EAASkN,GAAa,GAC7C/H,EAAuBb,EAAUtE,EAASkN,GAK1BC,mBAACnN,GACjB,OAAO8L,EAAKJ,IAAIvK,EAAWnB,GAAUgJ,KAAK4D,UAGlBO,2BAACnN,EAASuB,EAAS,IAC3C,OAAOyH,KAAKoE,YAAYpN,IAAY,IAAIgJ,KAAKhJ,EAA2B,iBAAXuB,EAAsBA,EAAS,MAG5E8L,qBAChB,MAtCY,QAyCC5I,kBACb,MAAM,IAAI6I,MAAM,uEAGCV,sBACjB,MAAQ,MAAK5D,KAAKvE,KAGAqI,uBAClB,MAAQ,IAAG9D,KAAK4D,UC5DpB,MAAMW,EAAuB,CAACC,EAAWC,EAAS,UAChD,MAAMC,EAAc,gBAAeF,EAAUV,UACvCtI,EAAOgJ,EAAU/I,KAEvB6E,EAAaQ,GAAGrJ,SAAUiN,EAAa,qBAAoBlJ,OAAU,SAAU0D,GAK7E,GAJI,CAAC,IAAK,QAAQ9H,SAAS4I,KAAK2E,UAC9BzF,EAAMyD,iBAGJ/I,EAAWoG,MACb,OAGF,MAAMhD,EAASrF,EAAuBqI,OAASA,KAAK4E,QAAS,IAAGpJ,GAC/CgJ,EAAUK,oBAAoB7H,GAGtCyH,SCMb,MAAMK,UAAcrB,EAGHhI,kBACb,MAnBS,QAwBXsJ,QAGE,GAFmBzE,EAAamB,QAAQzB,KAAK2D,SArB5B,kBAuBF5B,iBACb,OAGF/B,KAAK2D,SAAS5J,UAAUwJ,OAxBJ,QA0BpB,MAAMW,EAAalE,KAAK2D,SAAS5J,UAAUC,SA3BvB,QA4BpBgG,KAAKiE,eAAe,IAAMjE,KAAKgF,kBAAmBhF,KAAK2D,SAAUO,GAInEc,kBACEhF,KAAK2D,SAASJ,SACdjD,EAAamB,QAAQzB,KAAK2D,SAnCR,mBAoClB3D,KAAK6D,UAKeM,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAOJ,EAAMD,oBAAoB7E,MAEvC,GAAsB,iBAAXzH,EAAX,CAIA,QAAqB4M,IAAjBD,EAAK3M,IAAyBA,EAAOlB,WAAW,MAAmB,gBAAXkB,EAC1D,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,GAAQyH,WAWnBuE,EAAqBO,EAAO,SAQ5B1J,EAAmB0J,GC7DnB,MAAMM,UAAe3B,EAGJhI,kBACb,MArBS,SA0BX4J,SAEErF,KAAK2D,SAAS2B,aAAa,eAAgBtF,KAAK2D,SAAS5J,UAAUsL,OAvB7C,WA4BFlB,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAOE,EAAOP,oBAAoB7E,MAEzB,WAAXzH,GACF2M,EAAK3M,SChDb,SAASgN,EAAcC,GACrB,MAAY,SAARA,GAIQ,UAARA,IAIAA,IAAQ9I,OAAO8I,GAAKxM,WACf0D,OAAO8I,GAGJ,KAARA,GAAsB,SAARA,EACT,KAGFA,GAGT,SAASC,EAAiBjD,GACxB,OAAOA,EAAIrC,QAAQ,SAAUuF,GAAQ,IAAGA,EAAIvM,eDuC9CmH,EAAaQ,GAAGrJ,SAzCc,2BAFD,4BA2CyCyH,IACpEA,EAAMyD,iBAEN,MAAMgD,EAASzG,EAAMlC,OAAO4H,QA9CD,6BA+CdQ,EAAOP,oBAAoBc,GAEnCN,WAUPjK,EAAmBgK,GCpDnB,MAAMQ,EAAc,CAClBC,iBAAiB7O,EAASwL,EAAK1J,GAC7B9B,EAAQsO,aAAc,WAAUG,EAAiBjD,GAAQ1J,IAG3DgN,oBAAoB9O,EAASwL,GAC3BxL,EAAQ+O,gBAAiB,WAAUN,EAAiBjD,KAGtDwD,kBAAkBhP,GAChB,IAAKA,EACH,MAAO,GAGT,MAAMiP,EAAa,GAUnB,OARAxN,OAAOC,KAAK1B,EAAQkP,SACjBC,OAAO3D,GAAOA,EAAInL,WAAW,OAC7BsB,QAAQ6J,IACP,IAAI4D,EAAU5D,EAAIrC,QAAQ,MAAO,IACjCiG,EAAUA,EAAQC,OAAO,GAAGlN,cAAgBiN,EAAQ7E,MAAM,EAAG6E,EAAQhO,QACrE6N,EAAWG,GAAWb,EAAcvO,EAAQkP,QAAQ1D,MAGjDyD,GAGTK,iBAAgB,CAACtP,EAASwL,IACjB+C,EAAcvO,EAAQE,aAAc,WAAUuO,EAAiBjD,KAGxE+D,OAAOvP,GACL,MAAMwP,EAAOxP,EAAQyP,wBAErB,MAAO,CACLC,IAAKF,EAAKE,IAAM3L,OAAO4L,YACvBC,KAAMJ,EAAKI,KAAO7L,OAAO8L,cAI7BC,SAAS9P,IACA,CACL0P,IAAK1P,EAAQ+P,UACbH,KAAM5P,EAAQgQ,cCzDdC,EAAiB,CACrBC,KAAI,CAACjQ,EAAUD,EAAUS,SAAS2C,kBACzB,GAAG+M,UAAUC,QAAQC,UAAUhH,iBAAiBpH,KAAKjC,EAASC,IAGvEqQ,QAAO,CAACrQ,EAAUD,EAAUS,SAAS2C,kBAC5BgN,QAAQC,UAAU3P,cAAcuB,KAAKjC,EAASC,GAGvDsQ,SAAQ,CAACvQ,EAASC,IACT,GAAGkQ,UAAUnQ,EAAQuQ,UACzBpB,OAAOqB,GAASA,EAAMC,QAAQxQ,IAGnCyQ,QAAQ1Q,EAASC,GACf,MAAMyQ,EAAU,GAEhB,IAAIC,EAAW3Q,EAAQyD,WAEvB,KAAOkN,GAAYA,EAASzP,WAAa2B,KAAKC,cArBhC,IAqBgD6N,EAASzP,UACjEyP,EAASF,QAAQxQ,IACnByQ,EAAQzL,KAAK0L,GAGfA,EAAWA,EAASlN,WAGtB,OAAOiN,GAGTE,KAAK5Q,EAASC,GACZ,IAAI4Q,EAAW7Q,EAAQ8Q,uBAEvB,KAAOD,GAAU,CACf,GAAIA,EAASJ,QAAQxQ,GACnB,MAAO,CAAC4Q,GAGVA,EAAWA,EAASC,uBAGtB,MAAO,IAGTC,KAAK/Q,EAASC,GACZ,IAAI8Q,EAAO/Q,EAAQgR,mBAEnB,KAAOD,GAAM,CACX,GAAIA,EAAKN,QAAQxQ,GACf,MAAO,CAAC8Q,GAGVA,EAAOA,EAAKC,mBAGd,MAAO,IAGTC,kBAAkBjR,GAChB,MAAMkR,EAAa,CACjB,IACA,SACA,QACA,WACA,SACA,UACA,aACA,4BACAC,IAAIlR,GAAeA,EAAF,yBAAmCmR,KAAK,MAE3D,OAAOpI,KAAKkH,KAAKgB,EAAYlR,GAASmP,OAAOkC,IAAOzO,EAAWyO,IAAO7O,EAAU6O,MCjD9EC,EAAU,CACdC,SAAU,IACVC,UAAU,EACVC,OAAO,EACPC,MAAO,QACPC,MAAM,EACNC,OAAO,GAGHC,EAAc,CAClBN,SAAU,mBACVC,SAAU,UACVC,MAAO,mBACPC,MAAO,mBACPC,KAAM,UACNC,MAAO,WAGHE,EAAa,OACbC,EAAa,OACbC,EAAiB,OACjBC,EAAkB,QAElBC,EAAmB,CACvBC,UAAkBF,EAClBG,WAAmBJ,GA4CrB,MAAMK,UAAiB5F,EACrBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAKuJ,OAAS,KACdvJ,KAAKwJ,UAAY,KACjBxJ,KAAKyJ,eAAiB,KACtBzJ,KAAK0J,WAAY,EACjB1J,KAAK2J,YAAa,EAClB3J,KAAK4J,aAAe,KACpB5J,KAAK6J,YAAc,EACnB7J,KAAK8J,YAAc,EAEnB9J,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKiK,mBAAqBhD,EAAeK,QA3BjB,uBA2B8CtH,KAAK2D,UAC3E3D,KAAKkK,gBAAkB,iBAAkBzS,SAAS2C,iBAAmB+P,UAAUC,eAAiB,EAChGpK,KAAKqK,cAAgBxJ,QAAQ9F,OAAOuP,cAEpCtK,KAAKuK,qBAKWjC,qBAChB,OAAOA,EAGM7M,kBACb,MA3GS,WAgHXsM,OACE/H,KAAKwK,OAAO1B,GAGd2B,mBAGOhT,SAASiT,QAAUlR,EAAUwG,KAAK2D,WACrC3D,KAAK+H,OAITH,OACE5H,KAAKwK,OAAOzB,GAGdL,MAAMxJ,GACCA,IACHc,KAAK0J,WAAY,GAGfzC,EAAeK,QApEI,2CAoEwBtH,KAAK2D,YAClD/L,EAAqBoI,KAAK2D,UAC1B3D,KAAK2K,OAAM,IAGbC,cAAc5K,KAAKwJ,WACnBxJ,KAAKwJ,UAAY,KAGnBmB,MAAMzL,GACCA,IACHc,KAAK0J,WAAY,GAGf1J,KAAKwJ,YACPoB,cAAc5K,KAAKwJ,WACnBxJ,KAAKwJ,UAAY,MAGfxJ,KAAK+J,SAAW/J,KAAK+J,QAAQxB,WAAavI,KAAK0J,YACjD1J,KAAK6K,kBAEL7K,KAAKwJ,UAAYsB,aACdrT,SAASsT,gBAAkB/K,KAAKyK,gBAAkBzK,KAAK+H,MAAMiD,KAAKhL,MACnEA,KAAK+J,QAAQxB,WAKnB0C,GAAGzN,GACDwC,KAAKyJ,eAAiBxC,EAAeK,QArGZ,wBAqG0CtH,KAAK2D,UACxE,MAAMuH,EAAclL,KAAKmL,cAAcnL,KAAKyJ,gBAE5C,GAAIjM,EAAQwC,KAAKuJ,OAAOnR,OAAS,GAAKoF,EAAQ,EAC5C,OAGF,GAAIwC,KAAK2J,WAEP,YADArJ,EAAaS,IAAIf,KAAK2D,SApIR,mBAoI8B,IAAM3D,KAAKiL,GAAGzN,IAI5D,GAAI0N,IAAgB1N,EAGlB,OAFAwC,KAAK0I,aACL1I,KAAK2K,QAIP,MAAMS,EAAQ5N,EAAQ0N,EACpBpC,EACAC,EAEF/I,KAAKwK,OAAOY,EAAOpL,KAAKuJ,OAAO/L,IAKjCwM,WAAWzR,GAOT,OANAA,EAAS,IACJ+P,KACA1C,EAAYI,kBAAkBhG,KAAK2D,aAChB,iBAAXpL,EAAsBA,EAAS,IAE5CF,EApMS,WAoMaE,EAAQsQ,GACvBtQ,EAGT8S,eACE,MAAMC,EAAY3N,KAAK4N,IAAIvL,KAAK8J,aAEhC,GAAIwB,GAnMgB,GAoMlB,OAGF,MAAME,EAAYF,EAAYtL,KAAK8J,YAEnC9J,KAAK8J,YAAc,EAEd0B,GAILxL,KAAKwK,OAAOgB,EAAY,EAAIvC,EAAkBD,GAGhDuB,qBACMvK,KAAK+J,QAAQvB,UACflI,EAAaQ,GAAGd,KAAK2D,SApLJ,sBAoL6BzE,GAASc,KAAKyL,SAASvM,IAG5C,UAAvBc,KAAK+J,QAAQrB,QACfpI,EAAaQ,GAAGd,KAAK2D,SAvLD,yBAuL6BzE,GAASc,KAAK0I,MAAMxJ,IACrEoB,EAAaQ,GAAGd,KAAK2D,SAvLD,yBAuL6BzE,GAASc,KAAK2K,MAAMzL,KAGnEc,KAAK+J,QAAQnB,OAAS5I,KAAKkK,iBAC7BlK,KAAK0L,0BAITA,0BACE,MAAMC,EAAQzM,KACRc,KAAKqK,eAnKU,QAmKQnL,EAAM0M,aApKZ,UAoKgD1M,EAAM0M,YAE/D5L,KAAKqK,gBACfrK,KAAK6J,YAAc3K,EAAM2M,QAAQ,GAAGC,SAFpC9L,KAAK6J,YAAc3K,EAAM4M,SAMvBC,EAAO7M,IAEXc,KAAK8J,YAAc5K,EAAM2M,SAAW3M,EAAM2M,QAAQzT,OAAS,EACzD,EACA8G,EAAM2M,QAAQ,GAAGC,QAAU9L,KAAK6J,aAG9BmC,EAAM9M,KACNc,KAAKqK,eAlLU,QAkLQnL,EAAM0M,aAnLZ,UAmLgD1M,EAAM0M,cACzE5L,KAAK8J,YAAc5K,EAAM4M,QAAU9L,KAAK6J,aAG1C7J,KAAKqL,eACsB,UAAvBrL,KAAK+J,QAAQrB,QASf1I,KAAK0I,QACD1I,KAAK4J,cACPqC,aAAajM,KAAK4J,cAGpB5J,KAAK4J,aAAe1M,WAAWgC,GAASc,KAAK2K,MAAMzL,GAtQ5B,IAsQ6Dc,KAAK+J,QAAQxB,YAIrGtB,EAAeC,KAjNO,qBAiNiBlH,KAAK2D,UAAUhL,QAAQuT,IAC5D5L,EAAaQ,GAAGoL,EAlOI,wBAkOuBC,GAAKA,EAAExJ,oBAGhD3C,KAAKqK,eACP/J,EAAaQ,GAAGd,KAAK2D,SAxOA,0BAwO6BzE,GAASyM,EAAMzM,IACjEoB,EAAaQ,GAAGd,KAAK2D,SAxOF,wBAwO6BzE,GAAS8M,EAAI9M,IAE7Dc,KAAK2D,SAAS5J,UAAUqS,IA9NG,mBAgO3B9L,EAAaQ,GAAGd,KAAK2D,SAhPD,yBAgP6BzE,GAASyM,EAAMzM,IAChEoB,EAAaQ,GAAGd,KAAK2D,SAhPF,wBAgP6BzE,GAAS6M,EAAK7M,IAC9DoB,EAAaQ,GAAGd,KAAK2D,SAhPH,uBAgP6BzE,GAAS8M,EAAI9M,KAIhEuM,SAASvM,GACP,GAAI,kBAAkB7F,KAAK6F,EAAMlC,OAAO2H,SACtC,OAGF,MAAM6G,EAAYtC,EAAiBhK,EAAMsD,KACrCgJ,IACFtM,EAAMyD,iBACN3C,KAAKwK,OAAOgB,IAIhBL,cAAcnU,GAKZ,OAJAgJ,KAAKuJ,OAASvS,GAAWA,EAAQyD,WAC/BwM,EAAeC,KAhPC,iBAgPmBlQ,EAAQyD,YAC3C,GAEKuF,KAAKuJ,OAAO9L,QAAQzG,GAG7BqV,gBAAgBjB,EAAO/N,GACrB,MAAMiP,EAASlB,IAAUtC,EACzB,OAAO3L,EAAqB6C,KAAKuJ,OAAQlM,EAAeiP,EAAQtM,KAAK+J,QAAQpB,MAG/E4D,mBAAmBzM,EAAe0M,GAChC,MAAMC,EAAczM,KAAKmL,cAAcrL,GACjC4M,EAAY1M,KAAKmL,cAAclE,EAAeK,QA9P3B,wBA8PyDtH,KAAK2D,WAEvF,OAAOrD,EAAamB,QAAQzB,KAAK2D,SAxRhB,oBAwRuC,CACtD7D,cAAAA,EACA0L,UAAWgB,EACXlJ,KAAMoJ,EACNzB,GAAIwB,IAIRE,2BAA2B3V,GACzB,GAAIgJ,KAAKiK,mBAAoB,CAC3B,MAAM2C,EAAkB3F,EAAeK,QA3QrB,UA2Q8CtH,KAAKiK,oBAErE2C,EAAgB7S,UAAUwJ,OArRN,UAsRpBqJ,EAAgB7G,gBAAgB,gBAEhC,MAAM8G,EAAa5F,EAAeC,KA1Qb,mBA0QsClH,KAAKiK,oBAEhE,IAAK,IAAIjL,EAAI,EAAGA,EAAI6N,EAAWzU,OAAQ4G,IACrC,GAAItC,OAAOoQ,SAASD,EAAW7N,GAAG9H,aAAa,oBAAqB,MAAQ8I,KAAKmL,cAAcnU,GAAU,CACvG6V,EAAW7N,GAAGjF,UAAUqS,IA5RR,UA6RhBS,EAAW7N,GAAGsG,aAAa,eAAgB,QAC3C,QAMRuF,kBACE,MAAM7T,EAAUgJ,KAAKyJ,gBAAkBxC,EAAeK,QA5R7B,wBA4R2DtH,KAAK2D,UAEzF,IAAK3M,EACH,OAGF,MAAM+V,EAAkBrQ,OAAOoQ,SAAS9V,EAAQE,aAAa,oBAAqB,IAE9E6V,GACF/M,KAAK+J,QAAQiD,gBAAkBhN,KAAK+J,QAAQiD,iBAAmBhN,KAAK+J,QAAQxB,SAC5EvI,KAAK+J,QAAQxB,SAAWwE,GAExB/M,KAAK+J,QAAQxB,SAAWvI,KAAK+J,QAAQiD,iBAAmBhN,KAAK+J,QAAQxB,SAIzEiC,OAAOyC,EAAkBjW,GACvB,MAAMoU,EAAQpL,KAAKkN,kBAAkBD,GAC/B5P,EAAgB4J,EAAeK,QA9SZ,wBA8S0CtH,KAAK2D,UAClEwJ,EAAqBnN,KAAKmL,cAAc9N,GACxC+P,EAAcpW,GAAWgJ,KAAKqM,gBAAgBjB,EAAO/N,GAErDgQ,EAAmBrN,KAAKmL,cAAciC,GACtCE,EAAYzM,QAAQb,KAAKwJ,WAEzB8C,EAASlB,IAAUtC,EACnByE,EAAuBjB,EA5TR,sBADF,oBA8TbkB,EAAiBlB,EA5TH,qBACA,qBA4TdE,EAAqBxM,KAAKyN,kBAAkBrC,GAElD,GAAIgC,GAAeA,EAAYrT,UAAUC,SAnUnB,UAqUpB,YADAgG,KAAK2J,YAAa,GAIpB,GAAI3J,KAAK2J,WACP,OAIF,GADmB3J,KAAKuM,mBAAmBa,EAAaZ,GACzCzK,iBACb,OAGF,IAAK1E,IAAkB+P,EAErB,OAGFpN,KAAK2J,YAAa,EAEd2D,GACFtN,KAAK0I,QAGP1I,KAAK2M,2BAA2BS,GAChCpN,KAAKyJ,eAAiB2D,EAEtB,MAAMM,EAAmB,KACvBpN,EAAamB,QAAQzB,KAAK2D,SA9WZ,mBA8WkC,CAC9C7D,cAAesN,EACf5B,UAAWgB,EACXlJ,KAAM6J,EACNlC,GAAIoC,KAIR,GAAIrN,KAAK2D,SAAS5J,UAAUC,SAvWP,SAuWmC,CACtDoT,EAAYrT,UAAUqS,IAAIoB,GAE1B7S,EAAOyS,GAEP/P,EAActD,UAAUqS,IAAImB,GAC5BH,EAAYrT,UAAUqS,IAAImB,GAE1B,MAAMI,EAAmB,KACvBP,EAAYrT,UAAUwJ,OAAOgK,EAAsBC,GACnDJ,EAAYrT,UAAUqS,IAlXJ,UAoXlB/O,EAActD,UAAUwJ,OApXN,SAoXgCiK,EAAgBD,GAElEvN,KAAK2J,YAAa,EAElBzM,WAAWwQ,EAAkB,IAG/B1N,KAAKiE,eAAe0J,EAAkBtQ,GAAe,QAErDA,EAActD,UAAUwJ,OA7XJ,UA8XpB6J,EAAYrT,UAAUqS,IA9XF,UAgYpBpM,KAAK2J,YAAa,EAClB+D,IAGEJ,GACFtN,KAAK2K,QAITuC,kBAAkB1B,GAChB,MAAK,CAACvC,EAAiBD,GAAgB5R,SAASoU,GAI5CtQ,IACKsQ,IAAcxC,EAAiBD,EAAaD,EAG9C0C,IAAcxC,EAAiBF,EAAaC,EAP1CyC,EAUXiC,kBAAkBrC,GAChB,MAAK,CAACtC,EAAYC,GAAY3R,SAASgU,GAInClQ,IACKkQ,IAAUrC,EAAaC,EAAiBC,EAG1CmC,IAAUrC,EAAaE,EAAkBD,EAPvCoC,EAYajH,yBAACnN,EAASuB,GAChC,MAAM2M,EAAOmE,EAASxE,oBAAoB7N,EAASuB,GAEnD,IAAIwR,QAAEA,GAAY7E,EACI,iBAAX3M,IACTwR,EAAU,IACLA,KACAxR,IAIP,MAAMqV,EAA2B,iBAAXrV,EAAsBA,EAASwR,EAAQtB,MAE7D,GAAsB,iBAAXlQ,EACT2M,EAAK+F,GAAG1S,QACH,GAAsB,iBAAXqV,EAAqB,CACrC,QAA4B,IAAjB1I,EAAK0I,GACd,MAAM,IAAItU,UAAW,oBAAmBsU,MAG1C1I,EAAK0I,UACI7D,EAAQxB,UAAYwB,EAAQ8D,OACrC3I,EAAKwD,QACLxD,EAAKyF,SAIaxG,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACfoE,EAASyE,kBAAkB9N,KAAMzH,MAIX4L,2BAACjF,GACzB,MAAMlC,EAASrF,EAAuBqI,MAEtC,IAAKhD,IAAWA,EAAOjD,UAAUC,SAxcT,YAyctB,OAGF,MAAMzB,EAAS,IACVqN,EAAYI,kBAAkBhJ,MAC9B4I,EAAYI,kBAAkBhG,OAE7B+N,EAAa/N,KAAK9I,aAAa,oBAEjC6W,IACFxV,EAAOgQ,UAAW,GAGpBc,EAASyE,kBAAkB9Q,EAAQzE,GAE/BwV,GACF1E,EAASjF,YAAYpH,GAAQiO,GAAG8C,GAGlC7O,EAAMyD,kBAUVrC,EAAaQ,GAAGrJ,SAxec,6BAkBF,sCAsdyC4R,EAAS2E,qBAE9E1N,EAAaQ,GAAG/F,OA3ea,4BA2egB,KAC3C,MAAMkT,EAAYhH,EAAeC,KAxdR,6BA0dzB,IAAK,IAAIlI,EAAI,EAAGC,EAAMgP,EAAU7V,OAAQ4G,EAAIC,EAAKD,IAC/CqK,EAASyE,kBAAkBG,EAAUjP,GAAIqK,EAASjF,YAAY6J,EAAUjP,OAW5E5D,EAAmBiO,GC5iBnB,MAKMf,EAAU,CACdjD,QAAQ,EACR6I,OAAQ,MAGJrF,GAAc,CAClBxD,OAAQ,UACR6I,OAAQ,kBA2BV,MAAMC,WAAiB1K,EACrBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAKoO,kBAAmB,EACxBpO,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKqO,cAAgB,GAErB,MAAMC,EAAarH,EAAeC,KAhBT,+BAkBzB,IAAK,IAAIlI,EAAI,EAAGC,EAAMqP,EAAWlW,OAAQ4G,EAAIC,EAAKD,IAAK,CACrD,MAAMuP,EAAOD,EAAWtP,GAClB/H,EAAWO,EAAuB+W,GAClCC,EAAgBvH,EAAeC,KAAKjQ,GACvCkP,OAAOsI,GAAaA,IAAczO,KAAK2D,UAEzB,OAAb1M,GAAqBuX,EAAcpW,SACrC4H,KAAK0O,UAAYzX,EACjB+I,KAAKqO,cAAcpS,KAAKsS,IAI5BvO,KAAK2O,sBAEA3O,KAAK+J,QAAQmE,QAChBlO,KAAK4O,0BAA0B5O,KAAKqO,cAAerO,KAAK6O,YAGtD7O,KAAK+J,QAAQ1E,QACfrF,KAAKqF,SAMSiD,qBAChB,OAAOA,EAGM7M,kBACb,MA/ES,WAoFX4J,SACMrF,KAAK6O,WACP7O,KAAK8O,OAEL9O,KAAK+O,OAITA,OACE,GAAI/O,KAAKoO,kBAAoBpO,KAAK6O,WAChC,OAGF,IACIG,EADAC,EAAU,GAGd,GAAIjP,KAAK+J,QAAQmE,OAAQ,CACvB,MAAM3G,EAAWN,EAAeC,KAAM,sBAAkDlH,KAAK+J,QAAQmE,QACrGe,EAAUhI,EAAeC,KAxEN,qBAwE6BlH,KAAK+J,QAAQmE,QAAQ/H,OAAOoI,IAAShH,EAASnQ,SAASmX,IAGzG,MAAMW,EAAYjI,EAAeK,QAAQtH,KAAK0O,WAC9C,GAAIO,EAAQ7W,OAAQ,CAClB,MAAM+W,EAAiBF,EAAQ/H,KAAKqH,GAAQW,IAAcX,GAG1D,GAFAS,EAAcG,EAAiBhB,GAAS/J,YAAY+K,GAAkB,KAElEH,GAAeA,EAAYZ,iBAC7B,OAKJ,GADmB9N,EAAamB,QAAQzB,KAAK2D,SApG7B,oBAqGD5B,iBACb,OAGFkN,EAAQtW,QAAQyW,IACVF,IAAcE,GAChBjB,GAAStJ,oBAAoBuK,EAAY,CAAE/J,QAAQ,IAASyJ,OAGzDE,GACHlM,EAAKC,IAAIqM,EA7HA,cA6HsB,QAInC,MAAMC,EAAYrP,KAAKsP,gBAEvBtP,KAAK2D,SAAS5J,UAAUwJ,OA9GA,YA+GxBvD,KAAK2D,SAAS5J,UAAUqS,IA9GE,cAgH1BpM,KAAK2D,SAAS4L,MAAMF,GAAa,EAEjCrP,KAAK4O,0BAA0B5O,KAAKqO,eAAe,GACnDrO,KAAKoO,kBAAmB,EAExB,MAYMoB,EAAc,UADSH,EAAU,GAAG9V,cAAgB8V,EAAU9N,MAAM,IAG1EvB,KAAKiE,eAdY,KACfjE,KAAKoO,kBAAmB,EAExBpO,KAAK2D,SAAS5J,UAAUwJ,OAxHA,cAyHxBvD,KAAK2D,SAAS5J,UAAUqS,IA1HF,WADJ,QA6HlBpM,KAAK2D,SAAS4L,MAAMF,GAAa,GAEjC/O,EAAamB,QAAQzB,KAAK2D,SApIX,sBA0Ia3D,KAAK2D,UAAU,GAC7C3D,KAAK2D,SAAS4L,MAAMF,GAAgBrP,KAAK2D,SAAS6L,GAAhB,KAGpCV,OACE,GAAI9O,KAAKoO,mBAAqBpO,KAAK6O,WACjC,OAIF,GADmBvO,EAAamB,QAAQzB,KAAK2D,SAlJ7B,oBAmJD5B,iBACb,OAGF,MAAMsN,EAAYrP,KAAKsP,gBAEvBtP,KAAK2D,SAAS4L,MAAMF,GAAgBrP,KAAK2D,SAAS8C,wBAAwB4I,GAAxC,KAElC1U,EAAOqF,KAAK2D,UAEZ3D,KAAK2D,SAAS5J,UAAUqS,IAvJE,cAwJ1BpM,KAAK2D,SAAS5J,UAAUwJ,OAzJA,WADJ,QA4JpB,MAAMkM,EAAqBzP,KAAKqO,cAAcjW,OAC9C,IAAK,IAAI4G,EAAI,EAAGA,EAAIyQ,EAAoBzQ,IAAK,CAC3C,MAAMyC,EAAUzB,KAAKqO,cAAcrP,GAC7BuP,EAAO5W,EAAuB8J,GAEhC8M,IAASvO,KAAK6O,SAASN,IACzBvO,KAAK4O,0BAA0B,CAACnN,IAAU,GAI9CzB,KAAKoO,kBAAmB,EASxBpO,KAAK2D,SAAS4L,MAAMF,GAAa,GAEjCrP,KAAKiE,eATY,KACfjE,KAAKoO,kBAAmB,EACxBpO,KAAK2D,SAAS5J,UAAUwJ,OAxKA,cAyKxBvD,KAAK2D,SAAS5J,UAAUqS,IA1KF,YA2KtB9L,EAAamB,QAAQzB,KAAK2D,SA/KV,uBAoLY3D,KAAK2D,UAAU,GAG/CkL,SAAS7X,EAAUgJ,KAAK2D,UACtB,OAAO3M,EAAQ+C,UAAUC,SArLL,QA0LtBgQ,WAAWzR,GAST,OARAA,EAAS,IACJ+P,KACA1C,EAAYI,kBAAkBhG,KAAK2D,aACnCpL,IAEE8M,OAASxE,QAAQtI,EAAO8M,QAC/B9M,EAAO2V,OAAS/V,EAAWI,EAAO2V,QAClC7V,EAvNS,WAuNaE,EAAQsQ,IACvBtQ,EAGT+W,gBACE,OAAOtP,KAAK2D,SAAS5J,UAAUC,SAnML,uBAEhB,QACC,SAmMb2U,sBACE,IAAK3O,KAAK+J,QAAQmE,OAChB,OAGF,MAAM3G,EAAWN,EAAeC,KAAM,sBAAkDlH,KAAK+J,QAAQmE,QACrGjH,EAAeC,KAtMU,8BAsMiBlH,KAAK+J,QAAQmE,QAAQ/H,OAAOoI,IAAShH,EAASnQ,SAASmX,IAC9F5V,QAAQ3B,IACP,MAAM0Y,EAAW/X,EAAuBX,GAEpC0Y,GACF1P,KAAK4O,0BAA0B,CAAC5X,GAAUgJ,KAAK6O,SAASa,MAKhEd,0BAA0Be,EAAcC,GACjCD,EAAavX,QAIlBuX,EAAahX,QAAQ4V,IACfqB,EACFrB,EAAKxU,UAAUwJ,OA9NM,aAgOrBgL,EAAKxU,UAAUqS,IAhOM,aAmOvBmC,EAAKjJ,aAAa,gBAAiBsK,KAMjBzL,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAM8E,EAAU,GACM,iBAAXxR,GAAuB,YAAYc,KAAKd,KACjDwR,EAAQ1E,QAAS,GAGnB,MAAMH,EAAOiJ,GAAStJ,oBAAoB7E,KAAM+J,GAEhD,GAAsB,iBAAXxR,EAAqB,CAC9B,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,UAYb+H,EAAaQ,GAAGrJ,SAxQc,6BAYD,+BA4PyC,SAAUyH,IAEjD,MAAzBA,EAAMlC,OAAO2H,SAAoBzF,EAAMa,gBAAmD,MAAjCb,EAAMa,eAAe4E,UAChFzF,EAAMyD,iBAGR,MAAM1L,EAAWO,EAAuBwI,MACfiH,EAAeC,KAAKjQ,GAE5B0B,QAAQ3B,IACvBmX,GAAStJ,oBAAoB7N,EAAS,CAAEqO,QAAQ,IAASA,cAW7DjK,EAAmB+S,IC3UZ,IAAIzH,GAAM,MACNmJ,GAAS,SACTC,GAAQ,QACRlJ,GAAO,OAEPmJ,GAAiB,CAACrJ,GAAKmJ,GAAQC,GAAOlJ,IAOtCoJ,GAAmCD,GAAeE,QAAO,SAAUC,EAAKC,GACjF,OAAOD,EAAI/I,OAAO,CAACgJ,EAAAA,SAAyBA,EAAAA,WAC3C,IACQC,GAA0B,GAAGjJ,OAAO4I,GAAgB,CAX7C,SAWqDE,QAAO,SAAUC,EAAKC,GAC3F,OAAOD,EAAI/I,OAAO,CAACgJ,EAAWA,EAAAA,SAAyBA,EAAAA,WACtD,IAaQE,GAAiB,CAXJ,aACN,OACK,YAEC,aACN,OACK,YAEE,cACN,QACK,cC7BT,SAASC,GAAYtZ,GAClC,OAAOA,GAAWA,EAAQuZ,UAAY,IAAIpX,cAAgB,KCD7C,SAASqX,GAAUC,GAChC,GAAY,MAARA,EACF,OAAO1V,OAGT,GAAwB,oBAApB0V,EAAKzX,WAAkC,CACzC,IAAI0X,EAAgBD,EAAKC,cACzB,OAAOA,GAAgBA,EAAcC,aAAwB5V,OAG/D,OAAO0V,ECRT,SAAS1Y,GAAU0Y,GAEjB,OAAOA,aADUD,GAAUC,GAAMrJ,SACIqJ,aAAgBrJ,QAGvD,SAASwJ,GAAcH,GAErB,OAAOA,aADUD,GAAUC,GAAMI,aACIJ,aAAgBI,YAGvD,SAASC,GAAaL,GAEpB,MAA0B,oBAAfjW,aAKJiW,aADUD,GAAUC,GAAMjW,YACIiW,aAAgBjW,YCyDvD,IAAAuW,GAAe,CACbvV,KAAM,cACNwV,SAAS,EACTC,MAAO,QACPtV,GA5EF,SAAqBuV,GACnB,IAAIC,EAAQD,EAAKC,MACjB1Y,OAAOC,KAAKyY,EAAMC,UAAUzY,SAAQ,SAAU6C,GAC5C,IAAI+T,EAAQ4B,EAAME,OAAO7V,IAAS,GAC9ByK,EAAakL,EAAMlL,WAAWzK,IAAS,GACvCxE,EAAUma,EAAMC,SAAS5V,GAExBoV,GAAc5Z,IAAasZ,GAAYtZ,KAO5CyB,OAAO6Y,OAAOta,EAAQuY,MAAOA,GAC7B9W,OAAOC,KAAKuN,GAAYtN,SAAQ,SAAU6C,GACxC,IAAI1C,EAAQmN,EAAWzK,IAET,IAAV1C,EACF9B,EAAQ+O,gBAAgBvK,GAExBxE,EAAQsO,aAAa9J,GAAgB,IAAV1C,EAAiB,GAAKA,WAwDvDyY,OAlDF,SAAgBC,GACd,IAAIL,EAAQK,EAAML,MACdM,EAAgB,CAClBC,OAAQ,CACN5K,SAAUqK,EAAMQ,QAAQC,SACxBhL,KAAM,IACNF,IAAK,IACLmL,OAAQ,KAEVC,MAAO,CACLhL,SAAU,YAEZiL,UAAW,IASb,OAPAtZ,OAAO6Y,OAAOH,EAAMC,SAASM,OAAOnC,MAAOkC,EAAcC,QACzDP,EAAME,OAASI,EAEXN,EAAMC,SAASU,OACjBrZ,OAAO6Y,OAAOH,EAAMC,SAASU,MAAMvC,MAAOkC,EAAcK,OAGnD,WACLrZ,OAAOC,KAAKyY,EAAMC,UAAUzY,SAAQ,SAAU6C,GAC5C,IAAIxE,EAAUma,EAAMC,SAAS5V,GACzByK,EAAakL,EAAMlL,WAAWzK,IAAS,GAGvC+T,EAFkB9W,OAAOC,KAAKyY,EAAME,OAAOW,eAAexW,GAAQ2V,EAAME,OAAO7V,GAAQiW,EAAcjW,IAE7EyU,QAAO,SAAUV,EAAO3W,GAElD,OADA2W,EAAM3W,GAAY,GACX2W,IACN,IAEEqB,GAAc5Z,IAAasZ,GAAYtZ,KAI5CyB,OAAO6Y,OAAOta,EAAQuY,MAAOA,GAC7B9W,OAAOC,KAAKuN,GAAYtN,SAAQ,SAAUsZ,GACxCjb,EAAQ+O,gBAAgBkM,YAa9BC,SAAU,CAAC,kBCjFE,SAASC,GAAiBhC,GACvC,OAAOA,EAAU7Y,MAAM,KAAK,GCD9B,IAAI8a,GAAQzU,KAAKyU,MACF,SAAS3L,GAAsBzP,EAASqb,QAChC,IAAjBA,IACFA,GAAe,GAGjB,IAAI7L,EAAOxP,EAAQyP,wBACf6L,EAAS,EACTC,EAAS,EAQb,OANI3B,GAAc5Z,IAAYqb,IAE5BC,EAAS9L,EAAKgM,MAAQxb,EAAQyb,aAAe,EAC7CF,EAAS/L,EAAKkM,OAAS1b,EAAQ4D,cAAgB,GAG1C,CACL4X,MAAOJ,GAAM5L,EAAKgM,MAAQF,GAC1BI,OAAQN,GAAM5L,EAAKkM,OAASH,GAC5B7L,IAAK0L,GAAM5L,EAAKE,IAAM6L,GACtBzC,MAAOsC,GAAM5L,EAAKsJ,MAAQwC,GAC1BzC,OAAQuC,GAAM5L,EAAKqJ,OAAS0C,GAC5B3L,KAAMwL,GAAM5L,EAAKI,KAAO0L,GACxBK,EAAGP,GAAM5L,EAAKI,KAAO0L,GACrBM,EAAGR,GAAM5L,EAAKE,IAAM6L,ICtBT,SAASM,GAAc7b,GACpC,IAAI8b,EAAarM,GAAsBzP,GAGnCwb,EAAQxb,EAAQyb,YAChBC,EAAS1b,EAAQ4D,aAUrB,OARI+C,KAAK4N,IAAIuH,EAAWN,MAAQA,IAAU,IACxCA,EAAQM,EAAWN,OAGjB7U,KAAK4N,IAAIuH,EAAWJ,OAASA,IAAW,IAC1CA,EAASI,EAAWJ,QAGf,CACLC,EAAG3b,EAAQgQ,WACX4L,EAAG5b,EAAQ+P,UACXyL,MAAOA,EACPE,OAAQA,GCrBG,SAAS1Y,GAASkU,EAAQ1G,GACvC,IAAIuL,EAAWvL,EAAMlN,aAAekN,EAAMlN,cAE1C,GAAI4T,EAAOlU,SAASwN,GAClB,OAAO,EAEJ,GAAIuL,GAAYjC,GAAaiC,GAAW,CACzC,IAAIhL,EAAOP,EAEX,EAAG,CACD,GAAIO,GAAQmG,EAAO8E,WAAWjL,GAC5B,OAAO,EAITA,EAAOA,EAAKtN,YAAcsN,EAAKkL,WACxBlL,GAIb,OAAO,ECpBM,SAASrO,GAAiB1C,GACvC,OAAOwZ,GAAUxZ,GAAS0C,iBAAiB1C,GCD9B,SAASkc,GAAelc,GACrC,MAAO,CAAC,QAAS,KAAM,MAAMyG,QAAQ6S,GAAYtZ,KAAa,ECDjD,SAASmc,GAAmBnc,GAEzC,QAASe,GAAUf,GAAWA,EAAQ0Z,cACtC1Z,EAAQS,WAAasD,OAAOtD,UAAU2C,gBCDzB,SAASgZ,GAAcpc,GACpC,MAA6B,SAAzBsZ,GAAYtZ,GACPA,EAMPA,EAAQqc,cACRrc,EAAQyD,aACRqW,GAAa9Z,GAAWA,EAAQic,KAAO,OAEvCE,GAAmBnc,GCRvB,SAASsc,GAAoBtc,GAC3B,OAAK4Z,GAAc5Z,IACoB,UAAvC0C,GAAiB1C,GAAS8P,SAInB9P,EAAQuc,aAHN,KAwCI,SAASC,GAAgBxc,GAItC,IAHA,IAAI+D,EAASyV,GAAUxZ,GACnBuc,EAAeD,GAAoBtc,GAEhCuc,GAAgBL,GAAeK,IAA6D,WAA5C7Z,GAAiB6Z,GAAczM,UACpFyM,EAAeD,GAAoBC,GAGrC,OAAIA,IAA+C,SAA9BjD,GAAYiD,IAA0D,SAA9BjD,GAAYiD,IAAwE,WAA5C7Z,GAAiB6Z,GAAczM,UAC3H/L,EAGFwY,GA5CT,SAA4Bvc,GAC1B,IAAIyc,GAAsE,IAA1DtJ,UAAUuJ,UAAUva,cAAcsE,QAAQ,WAG1D,IAFuD,IAA5C0M,UAAUuJ,UAAUjW,QAAQ,YAE3BmT,GAAc5Z,IAII,UAFX0C,GAAiB1C,GAEnB8P,SACb,OAAO,KAMX,IAFA,IAAI6M,EAAcP,GAAcpc,GAEzB4Z,GAAc+C,IAAgB,CAAC,OAAQ,QAAQlW,QAAQ6S,GAAYqD,IAAgB,GAAG,CAC3F,IAAIC,EAAMla,GAAiBia,GAI3B,GAAsB,SAAlBC,EAAIC,WAA4C,SAApBD,EAAIE,aAA0C,UAAhBF,EAAIG,UAAiF,IAA1D,CAAC,YAAa,eAAetW,QAAQmW,EAAII,aAAsBP,GAAgC,WAAnBG,EAAII,YAA2BP,GAAaG,EAAIzN,QAAyB,SAAfyN,EAAIzN,OACjO,OAAOwN,EAEPA,EAAcA,EAAYlZ,WAI9B,OAAO,KAiBgBwZ,CAAmBjd,IAAY+D,EC9DzC,SAASmZ,GAAyB/D,GAC/C,MAAO,CAAC,MAAO,UAAU1S,QAAQ0S,IAAc,EAAI,IAAM,ICDpD,IAAIvS,GAAMD,KAAKC,IACXC,GAAMF,KAAKE,IACXuU,GAAQzU,KAAKyU,MCDT,SAAS+B,GAAOtW,EAAK/E,EAAO8E,GACzC,OAAOwW,GAAQvW,EAAKwW,GAAQvb,EAAO8E,ICDtB,SAAS0W,GAAmBC,GACzC,OAAO9b,OAAO6Y,OAAO,GCDd,CACL5K,IAAK,EACLoJ,MAAO,EACPD,OAAQ,EACRjJ,KAAM,GDHuC2N,GEFlC,SAASC,GAAgB1b,EAAOJ,GAC7C,OAAOA,EAAKuX,QAAO,SAAUwE,EAASjS,GAEpC,OADAiS,EAAQjS,GAAO1J,EACR2b,IACN,ICwFL,IAAAC,GAAe,CACblZ,KAAM,QACNwV,SAAS,EACTC,MAAO,OACPtV,GA9EF,SAAeuV,GACb,IAAIyD,EAEAxD,EAAQD,EAAKC,MACb3V,EAAO0V,EAAK1V,KACZmW,EAAUT,EAAKS,QACfiD,EAAezD,EAAMC,SAASU,MAC9B+C,EAAgB1D,EAAM2D,cAAcD,cACpCE,EAAgB5C,GAAiBhB,EAAMhB,WACvC6E,EAAOd,GAAyBa,GAEhC9V,EADa,CAAC2H,GAAMkJ,IAAOrS,QAAQsX,IAAkB,EAClC,SAAW,QAElC,GAAKH,GAAiBC,EAAtB,CAIA,IAAIN,EAxBgB,SAAyBU,EAAS9D,GAItD,OAAOmD,GAAsC,iBAH7CW,EAA6B,mBAAZA,EAAyBA,EAAQxc,OAAO6Y,OAAO,GAAIH,EAAM+D,MAAO,CAC/E/E,UAAWgB,EAAMhB,aACb8E,GACkDA,EAAUT,GAAgBS,EAASlF,KAoBvEoF,CAAgBxD,EAAQsD,QAAS9D,GACjDiE,EAAYvC,GAAc+B,GAC1BS,EAAmB,MAATL,EAAetO,GAAME,GAC/B0O,EAAmB,MAATN,EAAenF,GAASC,GAClCyF,EAAUpE,EAAM+D,MAAMnD,UAAU9S,GAAOkS,EAAM+D,MAAMnD,UAAUiD,GAAQH,EAAcG,GAAQ7D,EAAM+D,MAAMxD,OAAOzS,GAC9GuW,EAAYX,EAAcG,GAAQ7D,EAAM+D,MAAMnD,UAAUiD,GACxDS,EAAoBjC,GAAgBoB,GACpCc,EAAaD,EAA6B,MAATT,EAAeS,EAAkBE,cAAgB,EAAIF,EAAkBG,aAAe,EAAI,EAC3HC,EAAoBN,EAAU,EAAIC,EAAY,EAG9C3X,EAAM0W,EAAcc,GACpBzX,EAAM8X,EAAaN,EAAUnW,GAAOsV,EAAce,GAClDQ,EAASJ,EAAa,EAAIN,EAAUnW,GAAO,EAAI4W,EAC/CtP,EAAS4N,GAAOtW,EAAKiY,EAAQlY,GAE7BmY,EAAWf,EACf7D,EAAM2D,cAActZ,KAASmZ,EAAwB,IAA0BoB,GAAYxP,EAAQoO,EAAsBqB,aAAezP,EAASuP,EAAQnB,KA6CzJpD,OA1CF,SAAgBC,GACd,IAAIL,EAAQK,EAAML,MAEd8E,EADUzE,EAAMG,QACW3a,QAC3B4d,OAAoC,IAArBqB,EAA8B,sBAAwBA,EAErD,MAAhBrB,IAKwB,iBAAjBA,IACTA,EAAezD,EAAMC,SAASM,OAAOha,cAAckd,MAahD5a,GAASmX,EAAMC,SAASM,OAAQkD,KAQrCzD,EAAMC,SAASU,MAAQ8C,IAUvB1C,SAAU,CAAC,iBACXgE,iBAAkB,CAAC,oBC3FjBC,GAAa,CACfzP,IAAK,OACLoJ,MAAO,OACPD,OAAQ,OACRjJ,KAAM,QAgBD,SAASwP,GAAY5E,GAC1B,IAAI6E,EAEA3E,EAASF,EAAME,OACf4E,EAAa9E,EAAM8E,WACnBnG,EAAYqB,EAAMrB,UAClBoG,EAAU/E,EAAM+E,QAChBzP,EAAW0K,EAAM1K,SACjB0P,EAAkBhF,EAAMgF,gBACxBC,EAAWjF,EAAMiF,SACjBC,EAAelF,EAAMkF,aAErBC,GAAyB,IAAjBD,EAvBd,SAA2BxF,GACzB,IAAIyB,EAAIzB,EAAKyB,EACTC,EAAI1B,EAAK0B,EAETgE,EADM7b,OACI8b,kBAAoB,EAClC,MAAO,CACLlE,EAAGP,GAAMA,GAAMO,EAAIiE,GAAOA,IAAQ,EAClChE,EAAGR,GAAMA,GAAMQ,EAAIgE,GAAOA,IAAQ,GAgBAE,CAAkBP,GAAmC,mBAAjBG,EAA8BA,EAAaH,GAAWA,EAC1HQ,EAAUJ,EAAMhE,EAChBA,OAAgB,IAAZoE,EAAqB,EAAIA,EAC7BC,EAAUL,EAAM/D,EAChBA,OAAgB,IAAZoE,EAAqB,EAAIA,EAE7BC,EAAOV,EAAQvE,eAAe,KAC9BkF,EAAOX,EAAQvE,eAAe,KAC9BmF,EAAQvQ,GACRwQ,EAAQ1Q,GACR2Q,EAAMtc,OAEV,GAAI0b,EAAU,CACZ,IAAIlD,EAAeC,GAAgB9B,GAC/B4F,EAAa,eACbC,EAAY,cAEZhE,IAAiB/C,GAAUkB,IAGmB,WAA5ChY,GAFJ6Z,EAAeJ,GAAmBzB,IAEC5K,WACjCwQ,EAAa,eACbC,EAAY,eAKhBhE,EAAeA,EAEXpD,IAAczJ,KAChB0Q,EAAQvH,GAER+C,GAAKW,EAAa+D,GAAchB,EAAW5D,OAC3CE,GAAK4D,EAAkB,GAAK,GAG1BrG,IAAcvJ,KAChBuQ,EAAQrH,GAER6C,GAAKY,EAAagE,GAAajB,EAAW9D,MAC1CG,GAAK6D,EAAkB,GAAK,GAIhC,IAKMgB,EALFC,EAAehf,OAAO6Y,OAAO,CAC/BxK,SAAUA,GACT2P,GAAYN,IAEf,OAAIK,EAGK/d,OAAO6Y,OAAO,GAAImG,IAAeD,EAAiB,IAAmBJ,GAASF,EAAO,IAAM,GAAIM,EAAeL,GAASF,EAAO,IAAM,GAAIO,EAAe3D,WAAawD,EAAIR,kBAAoB,GAAK,EAAI,aAAelE,EAAI,OAASC,EAAI,MAAQ,eAAiBD,EAAI,OAASC,EAAI,SAAU4E,IAG3R/e,OAAO6Y,OAAO,GAAImG,IAAepB,EAAkB,IAAoBe,GAASF,EAAOtE,EAAI,KAAO,GAAIyD,EAAgBc,GAASF,EAAOtE,EAAI,KAAO,GAAI0D,EAAgBxC,UAAY,GAAIwC,IAsD9L,IAAAqB,GAAe,CACblc,KAAM,gBACNwV,SAAS,EACTC,MAAO,cACPtV,GAvDF,SAAuBgc,GACrB,IAAIxG,EAAQwG,EAAMxG,MACdQ,EAAUgG,EAAMhG,QAChBiG,EAAwBjG,EAAQ6E,gBAChCA,OAA4C,IAA1BoB,GAA0CA,EAC5DC,EAAoBlG,EAAQ8E,SAC5BA,OAAiC,IAAtBoB,GAAsCA,EACjDC,EAAwBnG,EAAQ+E,aAChCA,OAAyC,IAA1BoB,GAA0CA,EAYzDL,EAAe,CACjBtH,UAAWgC,GAAiBhB,EAAMhB,WAClCuB,OAAQP,EAAMC,SAASM,OACvB4E,WAAYnF,EAAM+D,MAAMxD,OACxB8E,gBAAiBA,GAGsB,MAArCrF,EAAM2D,cAAcD,gBACtB1D,EAAME,OAAOK,OAASjZ,OAAO6Y,OAAO,GAAIH,EAAME,OAAOK,OAAQ0E,GAAY3d,OAAO6Y,OAAO,GAAImG,EAAc,CACvGlB,QAASpF,EAAM2D,cAAcD,cAC7B/N,SAAUqK,EAAMQ,QAAQC,SACxB6E,SAAUA,EACVC,aAAcA,OAIe,MAA7BvF,EAAM2D,cAAchD,QACtBX,EAAME,OAAOS,MAAQrZ,OAAO6Y,OAAO,GAAIH,EAAME,OAAOS,MAAOsE,GAAY3d,OAAO6Y,OAAO,GAAImG,EAAc,CACrGlB,QAASpF,EAAM2D,cAAchD,MAC7BhL,SAAU,WACV2P,UAAU,EACVC,aAAcA,OAIlBvF,EAAMlL,WAAWyL,OAASjZ,OAAO6Y,OAAO,GAAIH,EAAMlL,WAAWyL,OAAQ,CACnEqG,wBAAyB5G,EAAMhB,aAUjCjL,KAAM,ICvJJ8S,GAAU,CACZA,SAAS,GAsCXC,GAAe,CACbzc,KAAM,iBACNwV,SAAS,EACTC,MAAO,QACPtV,GAAI,aACJ4V,OAxCF,SAAgBL,GACd,IAAIC,EAAQD,EAAKC,MACbnO,EAAWkO,EAAKlO,SAChB2O,EAAUT,EAAKS,QACfuG,EAAkBvG,EAAQwG,OAC1BA,OAA6B,IAApBD,GAAoCA,EAC7CE,EAAkBzG,EAAQ0G,OAC1BA,OAA6B,IAApBD,GAAoCA,EAC7Crd,EAASyV,GAAUW,EAAMC,SAASM,QAClC4G,EAAgB,GAAGnR,OAAOgK,EAAMmH,cAAcvG,UAAWZ,EAAMmH,cAAc5G,QAYjF,OAVIyG,GACFG,EAAc3f,SAAQ,SAAU4f,GAC9BA,EAAavc,iBAAiB,SAAUgH,EAASwV,OAAQR,OAIzDK,GACFtd,EAAOiB,iBAAiB,SAAUgH,EAASwV,OAAQR,IAG9C,WACDG,GACFG,EAAc3f,SAAQ,SAAU4f,GAC9BA,EAAatb,oBAAoB,SAAU+F,EAASwV,OAAQR,OAI5DK,GACFtd,EAAOkC,oBAAoB,SAAU+F,EAASwV,OAAQR,MAY1D9S,KAAM,IC/CJuT,GAAO,CACT7R,KAAM,QACNkJ,MAAO,OACPD,OAAQ,MACRnJ,IAAK,UAEQ,SAASgS,GAAqBvI,GAC3C,OAAOA,EAAUhQ,QAAQ,0BAA0B,SAAUwY,GAC3D,OAAOF,GAAKE,MCRhB,IAAIF,GAAO,CACT9M,MAAO,MACPK,IAAK,SAEQ,SAAS4M,GAA8BzI,GACpD,OAAOA,EAAUhQ,QAAQ,cAAc,SAAUwY,GAC/C,OAAOF,GAAKE,MCLD,SAASE,GAAgBpI,GACtC,IAAI4G,EAAM7G,GAAUC,GAGpB,MAAO,CACLqI,WAHezB,EAAIxQ,YAInBkS,UAHc1B,EAAI1Q,aCDP,SAASqS,GAAoBhiB,GAQ1C,OAAOyP,GAAsB0M,GAAmBnc,IAAU4P,KAAOiS,GAAgB7hB,GAAS8hB,WCV7E,SAASG,GAAejiB,GAErC,IAAIkiB,EAAoBxf,GAAiB1C,GACrCmiB,EAAWD,EAAkBC,SAC7BC,EAAYF,EAAkBE,UAC9BC,EAAYH,EAAkBG,UAElC,MAAO,6BAA6BhgB,KAAK8f,EAAWE,EAAYD,GCGnD,SAASE,GAAkBtiB,EAASoG,GACjD,IAAImc,OAES,IAATnc,IACFA,EAAO,IAGT,IAAImb,ECdS,SAASiB,EAAgB/I,GACtC,MAAI,CAAC,OAAQ,OAAQ,aAAahT,QAAQ6S,GAAYG,KAAU,EAEvDA,EAAKC,cAAc1V,KAGxB4V,GAAcH,IAASwI,GAAexI,GACjCA,EAGF+I,EAAgBpG,GAAc3C,IDIlB+I,CAAgBxiB,GAC/ByiB,EAASlB,KAAqE,OAAlDgB,EAAwBviB,EAAQ0Z,oBAAyB,EAAS6I,EAAsBve,MACpHqc,EAAM7G,GAAU+H,GAChBvb,EAASyc,EAAS,CAACpC,GAAKlQ,OAAOkQ,EAAIqC,gBAAkB,GAAIT,GAAeV,GAAgBA,EAAe,IAAMA,EAC7GoB,EAAcvc,EAAK+J,OAAOnK,GAC9B,OAAOyc,EAASE,EAChBA,EAAYxS,OAAOmS,GAAkBlG,GAAcpW,KExBtC,SAAS4c,GAAiBpT,GACvC,OAAO/N,OAAO6Y,OAAO,GAAI9K,EAAM,CAC7BI,KAAMJ,EAAKmM,EACXjM,IAAKF,EAAKoM,EACV9C,MAAOtJ,EAAKmM,EAAInM,EAAKgM,MACrB3C,OAAQrJ,EAAKoM,EAAIpM,EAAKkM,SCuB1B,SAASmH,GAA2B7iB,EAAS8iB,GAC3C,M/BpBoB,a+BoBbA,EAA8BF,GC1BxB,SAAyB5iB,GACtC,IAAIqgB,EAAM7G,GAAUxZ,GAChB+iB,EAAO5G,GAAmBnc,GAC1B0iB,EAAiBrC,EAAIqC,eACrBlH,EAAQuH,EAAKnE,YACblD,EAASqH,EAAKpE,aACdhD,EAAI,EACJC,EAAI,EAuBR,OAjBI8G,IACFlH,EAAQkH,EAAelH,MACvBE,EAASgH,EAAehH,OASnB,iCAAiCrZ,KAAK8Q,UAAUuJ,aACnDf,EAAI+G,EAAe1S,WACnB4L,EAAI8G,EAAe3S,YAIhB,CACLyL,MAAOA,EACPE,OAAQA,EACRC,EAAGA,EAAIqG,GAAoBhiB,GAC3B4b,EAAGA,GDRiDoH,CAAgBhjB,IAAY4Z,GAAckJ,GAdlG,SAAoC9iB,GAClC,IAAIwP,EAAOC,GAAsBzP,GASjC,OARAwP,EAAKE,IAAMF,EAAKE,IAAM1P,EAAQijB,UAC9BzT,EAAKI,KAAOJ,EAAKI,KAAO5P,EAAQkjB,WAChC1T,EAAKqJ,OAASrJ,EAAKE,IAAM1P,EAAQ2e,aACjCnP,EAAKsJ,MAAQtJ,EAAKI,KAAO5P,EAAQ4e,YACjCpP,EAAKgM,MAAQxb,EAAQ4e,YACrBpP,EAAKkM,OAAS1b,EAAQ2e,aACtBnP,EAAKmM,EAAInM,EAAKI,KACdJ,EAAKoM,EAAIpM,EAAKE,IACPF,EAI2G2T,CAA2BL,GAAkBF,GEtBlJ,SAAyB5iB,GACtC,IAAIuiB,EAEAQ,EAAO5G,GAAmBnc,GAC1BojB,EAAYvB,GAAgB7hB,GAC5BgE,EAA0D,OAAlDue,EAAwBviB,EAAQ0Z,oBAAyB,EAAS6I,EAAsBve,KAChGwX,EAAQ5U,GAAImc,EAAKM,YAAaN,EAAKnE,YAAa5a,EAAOA,EAAKqf,YAAc,EAAGrf,EAAOA,EAAK4a,YAAc,GACvGlD,EAAS9U,GAAImc,EAAKO,aAAcP,EAAKpE,aAAc3a,EAAOA,EAAKsf,aAAe,EAAGtf,EAAOA,EAAK2a,aAAe,GAC5GhD,GAAKyH,EAAUtB,WAAaE,GAAoBhiB,GAChD4b,GAAKwH,EAAUrB,UAMnB,MAJiD,QAA7Crf,GAAiBsB,GAAQ+e,GAAMvO,YACjCmH,GAAK/U,GAAImc,EAAKnE,YAAa5a,EAAOA,EAAK4a,YAAc,GAAKpD,GAGrD,CACLA,MAAOA,EACPE,OAAQA,EACRC,EAAGA,EACHC,EAAGA,GFG2K2H,CAAgBpH,GAAmBnc,KG7BtM,SAASwjB,GAAarK,GACnC,OAAOA,EAAU7Y,MAAM,KAAK,GCGf,SAASmjB,GAAevJ,GACrC,IAOIqF,EAPAxE,EAAYb,EAAKa,UACjB/a,EAAUka,EAAKla,QACfmZ,EAAYe,EAAKf,UACjB4E,EAAgB5E,EAAYgC,GAAiBhC,GAAa,KAC1DuK,EAAYvK,EAAYqK,GAAarK,GAAa,KAClDwK,EAAU5I,EAAUY,EAAIZ,EAAUS,MAAQ,EAAIxb,EAAQwb,MAAQ,EAC9DoI,EAAU7I,EAAUa,EAAIb,EAAUW,OAAS,EAAI1b,EAAQ0b,OAAS,EAGpE,OAAQqC,GACN,KAAKrO,GACH6P,EAAU,CACR5D,EAAGgI,EACH/H,EAAGb,EAAUa,EAAI5b,EAAQ0b,QAE3B,MAEF,KAAK7C,GACH0G,EAAU,CACR5D,EAAGgI,EACH/H,EAAGb,EAAUa,EAAIb,EAAUW,QAE7B,MAEF,KAAK5C,GACHyG,EAAU,CACR5D,EAAGZ,EAAUY,EAAIZ,EAAUS,MAC3BI,EAAGgI,GAEL,MAEF,KAAKhU,GACH2P,EAAU,CACR5D,EAAGZ,EAAUY,EAAI3b,EAAQwb,MACzBI,EAAGgI,GAEL,MAEF,QACErE,EAAU,CACR5D,EAAGZ,EAAUY,EACbC,EAAGb,EAAUa,GAInB,IAAIiI,EAAW9F,EAAgBb,GAAyBa,GAAiB,KAEzE,GAAgB,MAAZ8F,EAAkB,CACpB,IAAI5b,EAAmB,MAAb4b,EAAmB,SAAW,QAExC,OAAQH,GACN,InClDa,QmCmDXnE,EAAQsE,GAAYtE,EAAQsE,IAAa9I,EAAU9S,GAAO,EAAIjI,EAAQiI,GAAO,GAC7E,MAEF,InCrDW,MmCsDTsX,EAAQsE,GAAYtE,EAAQsE,IAAa9I,EAAU9S,GAAO,EAAIjI,EAAQiI,GAAO,IAOnF,OAAOsX,EC1DM,SAASuE,GAAe3J,EAAOQ,QAC5B,IAAZA,IACFA,EAAU,IAGZ,IAAIoJ,EAAWpJ,EACXqJ,EAAqBD,EAAS5K,UAC9BA,OAAmC,IAAvB6K,EAAgC7J,EAAMhB,UAAY6K,EAC9DC,EAAoBF,EAASG,SAC7BA,OAAiC,IAAtBD,EpCXY,kBoCWqCA,EAC5DE,EAAwBJ,EAASK,aACjCA,OAAyC,IAA1BD,EpCZC,WoCY6CA,EAC7DE,EAAwBN,EAASO,eACjCA,OAA2C,IAA1BD,EpCbH,SoCa+CA,EAC7DE,EAAuBR,EAASS,YAChCA,OAAuC,IAAzBD,GAA0CA,EACxDE,EAAmBV,EAAS9F,QAC5BA,OAA+B,IAArBwG,EAA8B,EAAIA,EAC5ClH,EAAgBD,GAAsC,iBAAZW,EAAuBA,EAAUT,GAAgBS,EAASlF,KACpG2L,EpCnBc,WoCmBDJ,EpClBI,YADH,SoCoBdK,EAAmBxK,EAAMC,SAASW,UAClCuE,EAAanF,EAAM+D,MAAMxD,OACzB1a,EAAUma,EAAMC,SAASoK,EAAcE,EAAaJ,GACpDM,ELmBS,SAAyB5kB,EAASkkB,EAAUE,GACzD,IAAIS,EAAmC,oBAAbX,EAlB5B,SAA4BlkB,GAC1B,IAAI8kB,EAAkBxC,GAAkBlG,GAAcpc,IAElD+kB,EADoB,CAAC,WAAY,SAASte,QAAQ/D,GAAiB1C,GAAS8P,WAAa,GACnD8J,GAAc5Z,GAAWwc,GAAgBxc,GAAWA,EAE9F,OAAKe,GAAUgkB,GAKRD,EAAgB3V,QAAO,SAAU2T,GACtC,OAAO/hB,GAAU+hB,IAAmB9f,GAAS8f,EAAgBiC,IAAmD,SAAhCzL,GAAYwJ,MALrF,GAYkDkC,CAAmBhlB,GAAW,GAAGmQ,OAAO+T,GAC/FY,EAAkB,GAAG3U,OAAO0U,EAAqB,CAACT,IAClDa,EAAsBH,EAAgB,GACtCI,EAAeJ,EAAgB7L,QAAO,SAAUkM,EAASrC,GAC3D,IAAItT,EAAOqT,GAA2B7iB,EAAS8iB,GAK/C,OAJAqC,EAAQzV,IAAM9I,GAAI4I,EAAKE,IAAKyV,EAAQzV,KACpCyV,EAAQrM,MAAQjS,GAAI2I,EAAKsJ,MAAOqM,EAAQrM,OACxCqM,EAAQtM,OAAShS,GAAI2I,EAAKqJ,OAAQsM,EAAQtM,QAC1CsM,EAAQvV,KAAOhJ,GAAI4I,EAAKI,KAAMuV,EAAQvV,MAC/BuV,IACNtC,GAA2B7iB,EAASilB,IAKvC,OAJAC,EAAa1J,MAAQ0J,EAAapM,MAAQoM,EAAatV,KACvDsV,EAAaxJ,OAASwJ,EAAarM,OAASqM,EAAaxV,IACzDwV,EAAavJ,EAAIuJ,EAAatV,KAC9BsV,EAAatJ,EAAIsJ,EAAaxV,IACvBwV,EKnCkBE,CAAgBrkB,GAAUf,GAAWA,EAAUA,EAAQqlB,gBAAkBlJ,GAAmBhC,EAAMC,SAASM,QAASwJ,EAAUE,GACnJkB,EAAsB7V,GAAsBkV,GAC5C9G,EAAgB4F,GAAe,CACjC1I,UAAWuK,EACXtlB,QAASsf,EACT1E,SAAU,WACVzB,UAAWA,IAEToM,EAAmB3C,GAAiBnhB,OAAO6Y,OAAO,GAAIgF,EAAYzB,IAClE2H,EpChCc,WoCgCMlB,EAA4BiB,EAAmBD,EAGnEG,EAAkB,CACpB/V,IAAKkV,EAAmBlV,IAAM8V,EAAkB9V,IAAM6N,EAAc7N,IACpEmJ,OAAQ2M,EAAkB3M,OAAS+L,EAAmB/L,OAAS0E,EAAc1E,OAC7EjJ,KAAMgV,EAAmBhV,KAAO4V,EAAkB5V,KAAO2N,EAAc3N,KACvEkJ,MAAO0M,EAAkB1M,MAAQ8L,EAAmB9L,MAAQyE,EAAczE,OAExE4M,EAAavL,EAAM2D,cAAcvO,OAErC,GpC3CkB,WoC2Cd+U,GAA6BoB,EAAY,CAC3C,IAAInW,EAASmW,EAAWvM,GACxB1X,OAAOC,KAAK+jB,GAAiB9jB,SAAQ,SAAU6J,GAC7C,IAAIma,EAAW,CAAC7M,GAAOD,IAAQpS,QAAQ+E,IAAQ,EAAI,GAAK,EACpDwS,EAAO,CAACtO,GAAKmJ,IAAQpS,QAAQ+E,IAAQ,EAAI,IAAM,IACnDia,EAAgBja,IAAQ+D,EAAOyO,GAAQ2H,KAI3C,OAAOF,EC1DM,SAASG,GAAqBzL,EAAOQ,QAClC,IAAZA,IACFA,EAAU,IAGZ,IAAIoJ,EAAWpJ,EACXxB,EAAY4K,EAAS5K,UACrB+K,EAAWH,EAASG,SACpBE,EAAeL,EAASK,aACxBnG,EAAU8F,EAAS9F,QACnB4H,EAAiB9B,EAAS8B,eAC1BC,EAAwB/B,EAASgC,sBACjCA,OAAkD,IAA1BD,EAAmCE,GAAgBF,EAC3EpC,EAAYF,GAAarK,GACzBC,EAAasK,EAAYmC,EAAiB7M,GAAsBA,GAAoB7J,QAAO,SAAUgK,GACvG,OAAOqK,GAAarK,KAAeuK,KAChC3K,GACDkN,EAAoB7M,EAAWjK,QAAO,SAAUgK,GAClD,OAAO4M,EAAsBtf,QAAQ0S,IAAc,KAGpB,IAA7B8M,EAAkB7kB,SACpB6kB,EAAoB7M,GAQtB,IAAI8M,EAAYD,EAAkBhN,QAAO,SAAUC,EAAKC,GAOtD,OANAD,EAAIC,GAAa2K,GAAe3J,EAAO,CACrChB,UAAWA,EACX+K,SAAUA,EACVE,aAAcA,EACdnG,QAASA,IACR9C,GAAiBhC,IACbD,IACN,IACH,OAAOzX,OAAOC,KAAKwkB,GAAWC,MAAK,SAAUC,EAAGC,GAC9C,OAAOH,EAAUE,GAAKF,EAAUG,MC6FpC,IAAAC,GAAe,CACb9hB,KAAM,OACNwV,SAAS,EACTC,MAAO,OACPtV,GA5HF,SAAcuV,GACZ,IAAIC,EAAQD,EAAKC,MACbQ,EAAUT,EAAKS,QACfnW,EAAO0V,EAAK1V,KAEhB,IAAI2V,EAAM2D,cAActZ,GAAM+hB,MAA9B,CAoCA,IAhCA,IAAIC,EAAoB7L,EAAQkJ,SAC5B4C,OAAsC,IAAtBD,GAAsCA,EACtDE,EAAmB/L,EAAQgM,QAC3BC,OAAoC,IAArBF,GAAqCA,EACpDG,EAA8BlM,EAAQmM,mBACtC7I,EAAUtD,EAAQsD,QAClBiG,EAAWvJ,EAAQuJ,SACnBE,EAAezJ,EAAQyJ,aACvBI,EAAc7J,EAAQ6J,YACtBuC,EAAwBpM,EAAQkL,eAChCA,OAA2C,IAA1BkB,GAA0CA,EAC3DhB,EAAwBpL,EAAQoL,sBAChCiB,EAAqB7M,EAAMQ,QAAQxB,UACnC4E,EAAgB5C,GAAiB6L,GAEjCF,EAAqBD,IADH9I,IAAkBiJ,GACqCnB,EAjC/E,SAAuC1M,GACrC,GtCLgB,SsCKZgC,GAAiBhC,GACnB,MAAO,GAGT,IAAI8N,EAAoBvF,GAAqBvI,GAC7C,MAAO,CAACyI,GAA8BzI,GAAY8N,EAAmBrF,GAA8BqF,IA2BwCC,CAA8BF,GAA3E,CAACtF,GAAqBsF,KAChH5N,EAAa,CAAC4N,GAAoB7W,OAAO2W,GAAoB7N,QAAO,SAAUC,EAAKC,GACrF,OAAOD,EAAI/I,OtCvCG,SsCuCIgL,GAAiBhC,GAAsByM,GAAqBzL,EAAO,CACnFhB,UAAWA,EACX+K,SAAUA,EACVE,aAAcA,EACdnG,QAASA,EACT4H,eAAgBA,EAChBE,sBAAuBA,IACpB5M,KACJ,IACCgO,EAAgBhN,EAAM+D,MAAMnD,UAC5BuE,EAAanF,EAAM+D,MAAMxD,OACzB0M,EAAY,IAAIvb,IAChBwb,GAAqB,EACrBC,EAAwBlO,EAAW,GAE9BpR,EAAI,EAAGA,EAAIoR,EAAWhY,OAAQ4G,IAAK,CAC1C,IAAImR,EAAYC,EAAWpR,GAEvBuf,EAAiBpM,GAAiBhC,GAElCqO,EtCzDW,UsCyDQhE,GAAarK,GAChCsO,EAAa,CAAC/X,GAAKmJ,IAAQpS,QAAQ8gB,IAAmB,EACtDtf,EAAMwf,EAAa,QAAU,SAC7BtF,EAAW2B,GAAe3J,EAAO,CACnChB,UAAWA,EACX+K,SAAUA,EACVE,aAAcA,EACdI,YAAaA,EACbvG,QAASA,IAEPyJ,EAAoBD,EAAaD,EAAmB1O,GAAQlJ,GAAO4X,EAAmB3O,GAASnJ,GAE/FyX,EAAclf,GAAOqX,EAAWrX,KAClCyf,EAAoBhG,GAAqBgG,IAG3C,IAAIC,EAAmBjG,GAAqBgG,GACxCE,EAAS,GAUb,GARInB,GACFmB,EAAO3iB,KAAKkd,EAASoF,IAAmB,GAGtCX,GACFgB,EAAO3iB,KAAKkd,EAASuF,IAAsB,EAAGvF,EAASwF,IAAqB,GAG1EC,EAAOC,OAAM,SAAUC,GACzB,OAAOA,KACL,CACFR,EAAwBnO,EACxBkO,GAAqB,EACrB,MAGFD,EAAUrb,IAAIoN,EAAWyO,GAG3B,GAAIP,EAqBF,IAnBA,IAEIU,EAAQ,SAAeC,GACzB,IAAIC,EAAmB7O,EAAWlJ,MAAK,SAAUiJ,GAC/C,IAAIyO,EAASR,EAAU1b,IAAIyN,GAE3B,GAAIyO,EACF,OAAOA,EAAOrd,MAAM,EAAGyd,GAAIH,OAAM,SAAUC,GACzC,OAAOA,QAKb,GAAIG,EAEF,OADAX,EAAwBW,EACjB,SAIFD,EAnBYnC,EAAiB,EAAI,EAmBZmC,EAAK,GAGpB,UAFFD,EAAMC,GADmBA,KAOpC7N,EAAMhB,YAAcmO,IACtBnN,EAAM2D,cAActZ,GAAM+hB,OAAQ,EAClCpM,EAAMhB,UAAYmO,EAClBnN,EAAM+N,OAAQ,KAUhBhJ,iBAAkB,CAAC,UACnBhR,KAAM,CACJqY,OAAO,IC7IX,SAAS4B,GAAehG,EAAU3S,EAAM4Y,GAQtC,YAPyB,IAArBA,IACFA,EAAmB,CACjBzM,EAAG,EACHC,EAAG,IAIA,CACLlM,IAAKyS,EAASzS,IAAMF,EAAKkM,OAAS0M,EAAiBxM,EACnD9C,MAAOqJ,EAASrJ,MAAQtJ,EAAKgM,MAAQ4M,EAAiBzM,EACtD9C,OAAQsJ,EAAStJ,OAASrJ,EAAKkM,OAAS0M,EAAiBxM,EACzDhM,KAAMuS,EAASvS,KAAOJ,EAAKgM,MAAQ4M,EAAiBzM,GAIxD,SAAS0M,GAAsBlG,GAC7B,MAAO,CAACzS,GAAKoJ,GAAOD,GAAQjJ,IAAM0Y,MAAK,SAAUC,GAC/C,OAAOpG,EAASoG,IAAS,KAiC7B,IAAAC,GAAe,CACbhkB,KAAM,OACNwV,SAAS,EACTC,MAAO,OACPiF,iBAAkB,CAAC,mBACnBva,GAlCF,SAAcuV,GACZ,IAAIC,EAAQD,EAAKC,MACb3V,EAAO0V,EAAK1V,KACZ2iB,EAAgBhN,EAAM+D,MAAMnD,UAC5BuE,EAAanF,EAAM+D,MAAMxD,OACzB0N,EAAmBjO,EAAM2D,cAAc2K,gBACvCC,EAAoB5E,GAAe3J,EAAO,CAC5CmK,eAAgB,cAEdqE,EAAoB7E,GAAe3J,EAAO,CAC5CqK,aAAa,IAEXoE,EAA2BT,GAAeO,EAAmBvB,GAC7D0B,EAAsBV,GAAeQ,EAAmBrJ,EAAY8I,GACpEU,EAAoBT,GAAsBO,GAC1CG,EAAmBV,GAAsBQ,GAC7C1O,EAAM2D,cAActZ,GAAQ,CAC1BokB,yBAA0BA,EAC1BC,oBAAqBA,EACrBC,kBAAmBA,EACnBC,iBAAkBA,GAEpB5O,EAAMlL,WAAWyL,OAASjZ,OAAO6Y,OAAO,GAAIH,EAAMlL,WAAWyL,OAAQ,CACnEsO,+BAAgCF,EAChCG,sBAAuBF,MCH3BG,GAAe,CACb1kB,KAAM,SACNwV,SAAS,EACTC,MAAO,OACPiB,SAAU,CAAC,iBACXvW,GA5BF,SAAgB6V,GACd,IAAIL,EAAQK,EAAML,MACdQ,EAAUH,EAAMG,QAChBnW,EAAOgW,EAAMhW,KACb2kB,EAAkBxO,EAAQpL,OAC1BA,OAA6B,IAApB4Z,EAA6B,CAAC,EAAG,GAAKA,EAC/Cjb,EAAOkL,GAAWH,QAAO,SAAUC,EAAKC,GAE1C,OADAD,EAAIC,GA5BD,SAAiCA,EAAW+E,EAAO3O,GACxD,IAAIwO,EAAgB5C,GAAiBhC,GACjCiQ,EAAiB,CAACxZ,GAAMF,IAAKjJ,QAAQsX,IAAkB,GAAK,EAAI,EAEhE7D,EAAyB,mBAAX3K,EAAwBA,EAAO9N,OAAO6Y,OAAO,GAAI4D,EAAO,CACxE/E,UAAWA,KACP5J,EACF8Z,EAAWnP,EAAK,GAChBoP,EAAWpP,EAAK,GAIpB,OAFAmP,EAAWA,GAAY,EACvBC,GAAYA,GAAY,GAAKF,EACtB,CAACxZ,GAAMkJ,IAAOrS,QAAQsX,IAAkB,EAAI,CACjDpC,EAAG2N,EACH1N,EAAGyN,GACD,CACF1N,EAAG0N,EACHzN,EAAG0N,GAWcC,CAAwBpQ,EAAWgB,EAAM+D,MAAO3O,GAC1D2J,IACN,IACCsQ,EAAwBtb,EAAKiM,EAAMhB,WACnCwC,EAAI6N,EAAsB7N,EAC1BC,EAAI4N,EAAsB5N,EAEW,MAArCzB,EAAM2D,cAAcD,gBACtB1D,EAAM2D,cAAcD,cAAclC,GAAKA,EACvCxB,EAAM2D,cAAcD,cAAcjC,GAAKA,GAGzCzB,EAAM2D,cAActZ,GAAQ0J,ICxB9Bub,GAAe,CACbjlB,KAAM,gBACNwV,SAAS,EACTC,MAAO,OACPtV,GApBF,SAAuBuV,GACrB,IAAIC,EAAQD,EAAKC,MACb3V,EAAO0V,EAAK1V,KAKhB2V,EAAM2D,cAActZ,GAAQif,GAAe,CACzC1I,UAAWZ,EAAM+D,MAAMnD,UACvB/a,QAASma,EAAM+D,MAAMxD,OACrBE,SAAU,WACVzB,UAAWgB,EAAMhB,aAUnBjL,KAAM,IC6FRwb,GAAe,CACbllB,KAAM,kBACNwV,SAAS,EACTC,MAAO,OACPtV,GA5GF,SAAyBuV,GACvB,IAAIC,EAAQD,EAAKC,MACbQ,EAAUT,EAAKS,QACfnW,EAAO0V,EAAK1V,KACZgiB,EAAoB7L,EAAQkJ,SAC5B4C,OAAsC,IAAtBD,GAAsCA,EACtDE,EAAmB/L,EAAQgM,QAC3BC,OAAoC,IAArBF,GAAsCA,EACrDxC,EAAWvJ,EAAQuJ,SACnBE,EAAezJ,EAAQyJ,aACvBI,EAAc7J,EAAQ6J,YACtBvG,EAAUtD,EAAQsD,QAClB0L,EAAkBhP,EAAQiP,OAC1BA,OAA6B,IAApBD,GAAoCA,EAC7CE,EAAwBlP,EAAQmP,aAChCA,OAAyC,IAA1BD,EAAmC,EAAIA,EACtD1H,EAAW2B,GAAe3J,EAAO,CACnC+J,SAAUA,EACVE,aAAcA,EACdnG,QAASA,EACTuG,YAAaA,IAEXzG,EAAgB5C,GAAiBhB,EAAMhB,WACvCuK,EAAYF,GAAarJ,EAAMhB,WAC/B4Q,GAAmBrG,EACnBG,EAAW3G,GAAyBa,GACpC4I,ECrCY,MDqCS9C,ECrCH,IAAM,IDsCxBhG,EAAgB1D,EAAM2D,cAAcD,cACpCsJ,EAAgBhN,EAAM+D,MAAMnD,UAC5BuE,EAAanF,EAAM+D,MAAMxD,OACzBsP,EAA4C,mBAAjBF,EAA8BA,EAAaroB,OAAO6Y,OAAO,GAAIH,EAAM+D,MAAO,CACvG/E,UAAWgB,EAAMhB,aACb2Q,EACF5b,EAAO,CACTyN,EAAG,EACHC,EAAG,GAGL,GAAKiC,EAAL,CAIA,GAAI4I,GAAiBG,EAAc,CACjC,IAAIqD,EAAwB,MAAbpG,EAAmBnU,GAAME,GACpCsa,EAAuB,MAAbrG,EAAmBhL,GAASC,GACtC7Q,EAAmB,MAAb4b,EAAmB,SAAW,QACpCtU,EAASsO,EAAcgG,GACvBhd,EAAMgX,EAAcgG,GAAY1B,EAAS8H,GACzCrjB,EAAMiX,EAAcgG,GAAY1B,EAAS+H,GACzCC,EAAWP,GAAUtK,EAAWrX,GAAO,EAAI,EAC3CmiB,E1CxDW,U0CwDF1G,EAAsByD,EAAclf,GAAOqX,EAAWrX,GAC/DoiB,E1CzDW,U0CyDF3G,GAAuBpE,EAAWrX,IAAQkf,EAAclf,GAGjE2V,EAAezD,EAAMC,SAASU,MAC9BsD,EAAYwL,GAAUhM,EAAe/B,GAAc+B,GAAgB,CACrEpC,MAAO,EACPE,OAAQ,GAEN4O,EAAqBnQ,EAAM2D,cAAc,oBAAsB3D,EAAM2D,cAAc,oBAAoBG,QxBtEtG,CACLvO,IAAK,EACLoJ,MAAO,EACPD,OAAQ,EACRjJ,KAAM,GwBmEF2a,EAAkBD,EAAmBL,GACrCO,EAAkBF,EAAmBJ,GAMrCO,EAAWtN,GAAO,EAAGgK,EAAclf,GAAMmW,EAAUnW,IACnDyiB,EAAYX,EAAkB5C,EAAclf,GAAO,EAAIkiB,EAAWM,EAAWF,EAAkBP,EAAoBI,EAASK,EAAWF,EAAkBP,EACzJW,EAAYZ,GAAmB5C,EAAclf,GAAO,EAAIkiB,EAAWM,EAAWD,EAAkBR,EAAoBK,EAASI,EAAWD,EAAkBR,EAC1JvL,EAAoBtE,EAAMC,SAASU,OAAS0B,GAAgBrC,EAAMC,SAASU,OAC3E8P,EAAenM,EAAiC,MAAboF,EAAmBpF,EAAkBwE,WAAa,EAAIxE,EAAkByE,YAAc,EAAI,EAC7H2H,EAAsB1Q,EAAM2D,cAAcvO,OAAS4K,EAAM2D,cAAcvO,OAAO4K,EAAMhB,WAAW0K,GAAY,EAC3GiH,EAAYjN,EAAcgG,GAAY6G,EAAYG,EAAsBD,EACxEG,EAAYlN,EAAcgG,GAAY8G,EAAYE,EAEtD,GAAIpE,EAAe,CACjB,IAAIuE,EAAkB7N,GAAOyM,EAASvM,GAAQxW,EAAKikB,GAAajkB,EAAK0I,EAAQqa,EAASxM,GAAQxW,EAAKmkB,GAAankB,GAChHiX,EAAcgG,GAAYmH,EAC1B9c,EAAK2V,GAAYmH,EAAkBzb,EAGrC,GAAIqX,EAAc,CAChB,IAAIqE,EAAyB,MAAbpH,EAAmBnU,GAAME,GAErCsb,EAAwB,MAAbrH,EAAmBhL,GAASC,GAEvCqS,EAAUtN,EAAc8I,GAExByE,EAAOD,EAAUhJ,EAAS8I,GAE1BI,GAAOF,EAAUhJ,EAAS+I,GAE1BI,GAAmBnO,GAAOyM,EAASvM,GAAQ+N,EAAMN,GAAaM,EAAMD,EAASvB,EAASxM,GAAQiO,GAAMN,GAAaM,IAErHxN,EAAc8I,GAAW2E,GACzBpd,EAAKyY,GAAW2E,GAAmBH,GAIvChR,EAAM2D,cAActZ,GAAQ0J,IAS5BgR,iBAAkB,CAAC,WExGN,SAASqM,GAAiBC,EAAyBjP,EAAckP,QAC9D,IAAZA,IACFA,GAAU,GAGZ,IClBoChS,ECJOzZ,EFsBvC0rB,EAA0B9R,GAAc2C,GACxCoP,EAAuB/R,GAAc2C,IAf3C,SAAyBvc,GACvB,IAAIwP,EAAOxP,EAAQyP,wBACf6L,EAAS9L,EAAKgM,MAAQxb,EAAQyb,aAAe,EAC7CF,EAAS/L,EAAKkM,OAAS1b,EAAQ4D,cAAgB,EACnD,OAAkB,IAAX0X,GAA2B,IAAXC,EAWmCqQ,CAAgBrP,GACtEnZ,EAAkB+Y,GAAmBI,GACrC/M,EAAOC,GAAsB+b,EAAyBG,GACtDxK,EAAS,CACXW,WAAY,EACZC,UAAW,GAETxC,EAAU,CACZ5D,EAAG,EACHC,EAAG,GAkBL,OAfI8P,IAA4BA,IAA4BD,MACxB,SAA9BnS,GAAYiD,IAChB0F,GAAe7e,MACb+d,GClCgC1H,EDkCT8C,KCjCd/C,GAAUC,IAAUG,GAAcH,GCJxC,CACLqI,YAFyC9hB,EDQbyZ,GCNRqI,WACpBC,UAAW/hB,EAAQ+hB,WDGZF,GAAgBpI,IDmCnBG,GAAc2C,KAChBgD,EAAU9P,GAAsB8M,GAAc,IACtCZ,GAAKY,EAAa2G,WAC1B3D,EAAQ3D,GAAKW,EAAa0G,WACjB7f,IACTmc,EAAQ5D,EAAIqG,GAAoB5e,KAI7B,CACLuY,EAAGnM,EAAKI,KAAOuR,EAAOW,WAAavC,EAAQ5D,EAC3CC,EAAGpM,EAAKE,IAAMyR,EAAOY,UAAYxC,EAAQ3D,EACzCJ,MAAOhM,EAAKgM,MACZE,OAAQlM,EAAKkM,QGtCjB,IAAImQ,GAAkB,CACpB1S,UAAW,SACX2S,UAAW,GACXlR,SAAU,YAGZ,SAASmR,KACP,IAAK,IAAIC,EAAOC,UAAU7qB,OAAQsJ,EAAO,IAAI2B,MAAM2f,GAAOE,EAAO,EAAGA,EAAOF,EAAME,IAC/ExhB,EAAKwhB,GAAQD,UAAUC,GAGzB,OAAQxhB,EAAK4d,MAAK,SAAUtoB,GAC1B,QAASA,GAAoD,mBAAlCA,EAAQyP,0BAIhC,SAAS0c,GAAgBC,QACL,IAArBA,IACFA,EAAmB,IAGrB,IAAIC,EAAoBD,EACpBE,EAAwBD,EAAkBE,iBAC1CA,OAA6C,IAA1BD,EAAmC,GAAKA,EAC3DE,EAAyBH,EAAkBI,eAC3CA,OAA4C,IAA3BD,EAAoCX,GAAkBW,EAC3E,OAAO,SAAsBzR,EAAWL,EAAQC,QAC9B,IAAZA,IACFA,EAAU8R,GAGZ,IC/C6B9nB,EAC3B+nB,ED8CEvS,EAAQ,CACVhB,UAAW,SACXwT,iBAAkB,GAClBhS,QAASlZ,OAAO6Y,OAAO,GAAIuR,GAAiBY,GAC5C3O,cAAe,GACf1D,SAAU,CACRW,UAAWA,EACXL,OAAQA,GAEVzL,WAAY,GACZoL,OAAQ,IAENuS,EAAmB,GACnBC,GAAc,EACd7gB,EAAW,CACbmO,MAAOA,EACP2S,WAAY,SAAoBnS,GAC9BoS,IACA5S,EAAMQ,QAAUlZ,OAAO6Y,OAAO,GAAImS,EAAgBtS,EAAMQ,QAASA,GACjER,EAAMmH,cAAgB,CACpBvG,UAAWha,GAAUga,GAAauH,GAAkBvH,GAAaA,EAAUsK,eAAiB/C,GAAkBvH,EAAUsK,gBAAkB,GAC1I3K,OAAQ4H,GAAkB5H,IAI5B,IExE4BoR,EAC9BkB,EFuEML,EGtCG,SAAwBb,GAErC,IAAIa,EAlCN,SAAeb,GACb,IAAI3a,EAAM,IAAItF,IACVohB,EAAU,IAAIzlB,IACd0lB,EAAS,GA0Bb,OAzBApB,EAAUnqB,SAAQ,SAAUwrB,GAC1Bhc,EAAIpF,IAAIohB,EAAS3oB,KAAM2oB,MAkBzBrB,EAAUnqB,SAAQ,SAAUwrB,GACrBF,EAAQvkB,IAAIykB,EAAS3oB,OAhB5B,SAAS2hB,EAAKgH,GACZF,EAAQ7X,IAAI+X,EAAS3oB,MACN,GAAG2L,OAAOgd,EAASjS,UAAY,GAAIiS,EAASjO,kBAAoB,IACtEvd,SAAQ,SAAUyrB,GACzB,IAAKH,EAAQvkB,IAAI0kB,GAAM,CACrB,IAAIC,EAAclc,EAAIzF,IAAI0hB,GAEtBC,GACFlH,EAAKkH,OAIXH,EAAOjoB,KAAKkoB,GAMVhH,CAAKgH,MAGFD,EAKgB9Y,CAAM0X,GAE7B,OAAOzS,GAAeJ,QAAO,SAAUC,EAAKe,GAC1C,OAAOf,EAAI/I,OAAOwc,EAAiBxd,QAAO,SAAUge,GAClD,OAAOA,EAASlT,QAAUA,QAE3B,IH8B0BqT,EExEKxB,EFwEsB,GAAG3b,OAAOoc,EAAkBpS,EAAMQ,QAAQmR,WEvE9FkB,EAASlB,EAAU7S,QAAO,SAAU+T,EAAQO,GAC9C,IAAIC,EAAWR,EAAOO,EAAQ/oB,MAK9B,OAJAwoB,EAAOO,EAAQ/oB,MAAQgpB,EAAW/rB,OAAO6Y,OAAO,GAAIkT,EAAUD,EAAS,CACrE5S,QAASlZ,OAAO6Y,OAAO,GAAIkT,EAAS7S,QAAS4S,EAAQ5S,SACrDzM,KAAMzM,OAAO6Y,OAAO,GAAIkT,EAAStf,KAAMqf,EAAQrf,QAC5Cqf,EACEP,IACN,IAEIvrB,OAAOC,KAAKsrB,GAAQ7b,KAAI,SAAU3F,GACvC,OAAOwhB,EAAOxhB,QFsGV,OAvCA2O,EAAMwS,iBAAmBA,EAAiBxd,QAAO,SAAUse,GACzD,OAAOA,EAAEzT,WAqJbG,EAAMwS,iBAAiBhrB,SAAQ,SAAUge,GACvC,IAAInb,EAAOmb,EAAMnb,KACbkpB,EAAgB/N,EAAMhF,QACtBA,OAA4B,IAAlB+S,EAA2B,GAAKA,EAC1CnT,EAASoF,EAAMpF,OAEnB,GAAsB,mBAAXA,EAAuB,CAChC,IAAIoT,EAAYpT,EAAO,CACrBJ,MAAOA,EACP3V,KAAMA,EACNwH,SAAUA,EACV2O,QAASA,IAKXiS,EAAiB3nB,KAAK0oB,GAFT,kBA7HR3hB,EAASwV,UAOlBoM,YAAa,WACX,IAAIf,EAAJ,CAIA,IAAIgB,EAAkB1T,EAAMC,SACxBW,EAAY8S,EAAgB9S,UAC5BL,EAASmT,EAAgBnT,OAG7B,GAAKqR,GAAiBhR,EAAWL,GAAjC,CASAP,EAAM+D,MAAQ,CACZnD,UAAWwQ,GAAiBxQ,EAAWyB,GAAgB9B,GAAoC,UAA3BP,EAAMQ,QAAQC,UAC9EF,OAAQmB,GAAcnB,IAOxBP,EAAM+N,OAAQ,EACd/N,EAAMhB,UAAYgB,EAAMQ,QAAQxB,UAKhCgB,EAAMwS,iBAAiBhrB,SAAQ,SAAUwrB,GACvC,OAAOhT,EAAM2D,cAAcqP,EAAS3oB,MAAQ/C,OAAO6Y,OAAO,GAAI6S,EAASjf,SAIzE,IAAK,IAAI1H,EAAQ,EAAGA,EAAQ2T,EAAMwS,iBAAiBvrB,OAAQoF,IAUzD,IAAoB,IAAhB2T,EAAM+N,MAAV,CAMA,IAAI4F,EAAwB3T,EAAMwS,iBAAiBnmB,GAC/C7B,EAAKmpB,EAAsBnpB,GAC3BopB,EAAyBD,EAAsBnT,QAC/CoJ,OAAsC,IAA3BgK,EAAoC,GAAKA,EACpDvpB,EAAOspB,EAAsBtpB,KAEf,mBAAPG,IACTwV,EAAQxV,EAAG,CACTwV,MAAOA,EACPQ,QAASoJ,EACTvf,KAAMA,EACNwH,SAAUA,KACNmO,QAjBNA,EAAM+N,OAAQ,EACd1hB,GAAS,KAsBfgb,QCjM2B7c,EDiMV,WACf,OAAO,IAAIqpB,SAAQ,SAAUC,GAC3BjiB,EAAS4hB,cACTK,EAAQ9T,OClMT,WAUL,OATKuS,IACHA,EAAU,IAAIsB,SAAQ,SAAUC,GAC9BD,QAAQC,UAAUC,MAAK,WACrBxB,OAAUve,EACV8f,EAAQtpB,YAKP+nB,ID2LLyB,QAAS,WACPpB,IACAF,GAAc,IAIlB,IAAKd,GAAiBhR,EAAWL,GAK/B,OAAO1O,EAmCT,SAAS+gB,IACPH,EAAiBjrB,SAAQ,SAAUgD,GACjC,OAAOA,OAETioB,EAAmB,GAGrB,OAvCA5gB,EAAS8gB,WAAWnS,GAASuT,MAAK,SAAU/T,IACrC0S,GAAelS,EAAQyT,eAC1BzT,EAAQyT,cAAcjU,MAqCnBnO,GAGJ,IAAIqiB,GAA4BlC,KIzPnCkC,GAA4BlC,GAAgB,CAC9CI,iBAFqB,CAACtL,GAAgBpD,GAAeyQ,GAAeC,MCMlEF,GAA4BlC,GAAgB,CAC9CI,iBAFqB,CAACtL,GAAgBpD,GAAeyQ,GAAeC,GAAahf,GAAQif,GAAM/F,GAAiB3N,GAAOhD,2KpDNvG,+BAEC,YACF,sBACY,2BACP,kBACF,mBACG,4DAQC,kBACN,iBACK,uBAEC,kBACN,iBACK,wBAEE,oBACN,mBACK,0JqDGxB,MAYM2W,GAAiB,IAAIrsB,OAAQ,4BAqB7BssB,GAAgBxqB,IAAU,UAAY,YACtCyqB,GAAmBzqB,IAAU,YAAc,UAC3C0qB,GAAmB1qB,IAAU,aAAe,eAC5C2qB,GAAsB3qB,IAAU,eAAiB,aACjD4qB,GAAkB5qB,IAAU,aAAe,cAC3C6qB,GAAiB7qB,IAAU,cAAgB,aAE3CoN,GAAU,CACd/B,OAAQ,CAAC,EAAG,GACZ2U,SAAU,kBACVnJ,UAAW,SACXiU,QAAS,UACTC,aAAc,KACdC,WAAW,GAGPrd,GAAc,CAClBtC,OAAQ,0BACR2U,SAAU,mBACVnJ,UAAW,0BACXiU,QAAS,SACTC,aAAc,yBACdC,UAAW,oBASb,MAAMC,WAAiB1iB,EACrBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAKomB,QAAU,KACfpmB,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKqmB,MAAQrmB,KAAKsmB,kBAClBtmB,KAAKumB,UAAYvmB,KAAKwmB,gBAKNle,qBAChB,OAAOA,GAGaO,yBACpB,OAAOA,GAGMpN,kBACb,MArFS,WA0FX4J,SACE,OAAOrF,KAAK6O,WAAa7O,KAAK8O,OAAS9O,KAAK+O,OAG9CA,OACE,GAAInV,EAAWoG,KAAK2D,WAAa3D,KAAK6O,SAAS7O,KAAKqmB,OAClD,OAGF,MAAMvmB,EAAgB,CACpBA,cAAeE,KAAK2D,UAKtB,GAFkBrD,EAAamB,QAAQzB,KAAK2D,SAvF5B,mBAuFkD7D,GAEpDiC,iBACZ,OAGF,MAAMmM,EAASiY,GAASM,qBAAqBzmB,KAAK2D,UAE9C3D,KAAKumB,UACP3gB,EAAYC,iBAAiB7F,KAAKqmB,MAAO,SAAU,QAEnDrmB,KAAK0mB,cAAcxY,GAOjB,iBAAkBzW,SAAS2C,kBAC5B8T,EAAOtJ,QA5Fc,gBA6FtB,GAAGuC,UAAU1P,SAASuD,KAAKuM,UACxB5O,QAAQ4V,GAAQjO,EAAaQ,GAAGyN,EAAM,YAAa7T,IAGxDsF,KAAK2D,SAASgjB,QACd3mB,KAAK2D,SAAS2B,aAAa,iBAAiB,GAE5CtF,KAAKqmB,MAAMtsB,UAAUqS,IA5GD,QA6GpBpM,KAAK2D,SAAS5J,UAAUqS,IA7GJ,QA8GpB9L,EAAamB,QAAQzB,KAAK2D,SAnHT,oBAmHgC7D,GAGnDgP,OACE,GAAIlV,EAAWoG,KAAK2D,YAAc3D,KAAK6O,SAAS7O,KAAKqmB,OACnD,OAGF,MAAMvmB,EAAgB,CACpBA,cAAeE,KAAK2D,UAGtB3D,KAAK4mB,cAAc9mB,GAGrB+D,UACM7D,KAAKomB,SACPpmB,KAAKomB,QAAQjB,UAGf7b,MAAMzF,UAGR2U,SACExY,KAAKumB,UAAYvmB,KAAKwmB,gBAClBxmB,KAAKomB,SACPpmB,KAAKomB,QAAQ5N,SAMjBoO,cAAc9mB,GACMQ,EAAamB,QAAQzB,KAAK2D,SAvJ5B,mBAuJkD7D,GACpDiC,mBAMV,iBAAkBtK,SAAS2C,iBAC7B,GAAG+M,UAAU1P,SAASuD,KAAKuM,UACxB5O,QAAQ4V,GAAQjO,EAAaC,IAAIgO,EAAM,YAAa7T,IAGrDsF,KAAKomB,SACPpmB,KAAKomB,QAAQjB,UAGfnlB,KAAKqmB,MAAMtsB,UAAUwJ,OA/JD,QAgKpBvD,KAAK2D,SAAS5J,UAAUwJ,OAhKJ,QAiKpBvD,KAAK2D,SAAS2B,aAAa,gBAAiB,SAC5CM,EAAYE,oBAAoB9F,KAAKqmB,MAAO,UAC5C/lB,EAAamB,QAAQzB,KAAK2D,SA1KR,qBA0KgC7D,IAGpDkK,WAAWzR,GAST,GARAA,EAAS,IACJyH,KAAK0D,YAAY4E,WACjB1C,EAAYI,kBAAkBhG,KAAK2D,aACnCpL,GAGLF,EAnMS,WAmMaE,EAAQyH,KAAK0D,YAAYmF,aAEf,iBAArBtQ,EAAOwZ,YAA2Bha,EAAUQ,EAAOwZ,YACV,mBAA3CxZ,EAAOwZ,UAAUtL,sBAGxB,MAAM,IAAInN,UAzMH,WAyMqBC,cAAP,kGAGvB,OAAOhB,EAGTmuB,cAAcxY,GACZ,QAAsB,IAAX2Y,GACT,MAAM,IAAIvtB,UAAU,gEAGtB,IAAIqiB,EAAmB3b,KAAK2D,SAEG,WAA3B3D,KAAK+J,QAAQgI,UACf4J,EAAmBzN,EACVnW,EAAUiI,KAAK+J,QAAQgI,WAChC4J,EAAmBxjB,EAAW6H,KAAK+J,QAAQgI,WACA,iBAA3B/R,KAAK+J,QAAQgI,YAC7B4J,EAAmB3b,KAAK+J,QAAQgI,WAGlC,MAAMkU,EAAejmB,KAAK8mB,mBACpBC,EAAkBd,EAAanD,UAAU5b,KAAKid,GAA8B,gBAAlBA,EAAS3oB,OAA+C,IAArB2oB,EAASnT,SAE5GhR,KAAKomB,QAAUS,GAAoBlL,EAAkB3b,KAAKqmB,MAAOJ,GAE7Dc,GACFnhB,EAAYC,iBAAiB7F,KAAKqmB,MAAO,SAAU,UAIvDxX,SAAS7X,EAAUgJ,KAAK2D,UACtB,OAAO3M,EAAQ+C,UAAUC,SAnNL,QAsNtBssB,kBACE,OAAOrf,EAAec,KAAK/H,KAAK2D,SAhNd,kBAgNuC,GAG3DqjB,gBACE,MAAMC,EAAiBjnB,KAAK2D,SAASlJ,WAErC,GAAIwsB,EAAeltB,UAAUC,SA3NN,WA4NrB,OAAO8rB,GAGT,GAAImB,EAAeltB,UAAUC,SA9NJ,aA+NvB,OAAO+rB,GAIT,MAAMmB,EAAkF,QAA1ExtB,iBAAiBsG,KAAKqmB,OAAO1sB,iBAAiB,iBAAiBpC,OAE7E,OAAI0vB,EAAeltB,UAAUC,SAvOP,UAwObktB,EAAQvB,GAAmBD,GAG7BwB,EAAQrB,GAAsBD,GAGvCY,gBACE,OAA0D,OAAnDxmB,KAAK2D,SAASiB,QAAS,WAGhCuiB,aACE,MAAM5gB,OAAEA,GAAWvG,KAAK+J,QAExB,MAAsB,iBAAXxD,EACFA,EAAOjP,MAAM,KAAK6Q,IAAI3C,GAAO9I,OAAOoQ,SAAStH,EAAK,KAGrC,mBAAXe,EACF6gB,GAAc7gB,EAAO6gB,EAAYpnB,KAAK2D,UAGxC4C,EAGTugB,mBACE,MAAMO,EAAwB,CAC5BlX,UAAWnQ,KAAKgnB,gBAChBlE,UAAW,CAAC,CACVtnB,KAAM,kBACNmW,QAAS,CACPuJ,SAAUlb,KAAK+J,QAAQmR,WAG3B,CACE1f,KAAM,SACNmW,QAAS,CACPpL,OAAQvG,KAAKmnB,iBAanB,MAP6B,WAAzBnnB,KAAK+J,QAAQic,UACfqB,EAAsBvE,UAAY,CAAC,CACjCtnB,KAAM,cACNwV,SAAS,KAIN,IACFqW,KACsC,mBAA9BrnB,KAAK+J,QAAQkc,aAA8BjmB,KAAK+J,QAAQkc,aAAaoB,GAAyBrnB,KAAK+J,QAAQkc,cAI1HqB,iBAAgB9kB,IAAEA,EAAFxF,OAAOA,IACrB,MAAMuqB,EAAQtgB,EAAeC,KAxRF,8DAwR+BlH,KAAKqmB,OAAOlgB,OAAO3M,GAExE+tB,EAAMnvB,QAMX+E,EAAqBoqB,EAAOvqB,EAtTT,cAsTiBwF,GAAyB+kB,EAAMnwB,SAAS4F,IAAS2pB,QAKjExiB,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAOihB,GAASthB,oBAAoB7E,KAAMzH,GAEhD,GAAsB,iBAAXA,EAAX,CAIA,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,SAIQ4L,kBAACjF,GAChB,GAAIA,IA3UmB,IA2UTA,EAAMyG,QAAiD,UAAfzG,EAAMsB,MA9UhD,QA8UoEtB,EAAMsD,KACpF,OAGF,MAAMglB,EAAUvgB,EAAeC,KA7TN,+BA+TzB,IAAK,IAAIlI,EAAI,EAAGC,EAAMuoB,EAAQpvB,OAAQ4G,EAAIC,EAAKD,IAAK,CAClD,MAAMyoB,EAAUtB,GAAS/hB,YAAYojB,EAAQxoB,IAC7C,IAAKyoB,IAAyC,IAA9BA,EAAQ1d,QAAQmc,UAC9B,SAGF,IAAKuB,EAAQ5Y,WACX,SAGF,MAAM/O,EAAgB,CACpBA,cAAe2nB,EAAQ9jB,UAGzB,GAAIzE,EAAO,CACT,MAAMwoB,EAAexoB,EAAMwoB,eACrBC,EAAeD,EAAatwB,SAASqwB,EAAQpB,OACnD,GACEqB,EAAatwB,SAASqwB,EAAQ9jB,WACC,WAA9B8jB,EAAQ1d,QAAQmc,YAA2ByB,GACb,YAA9BF,EAAQ1d,QAAQmc,WAA2ByB,EAE5C,SAIF,GAAIF,EAAQpB,MAAMrsB,SAASkF,EAAMlC,UAA4B,UAAfkC,EAAMsB,MA9W5C,QA8WgEtB,EAAMsD,KAAoB,qCAAqCnJ,KAAK6F,EAAMlC,OAAO2H,UACvJ,SAGiB,UAAfzF,EAAMsB,OACRV,EAAc4E,WAAaxF,GAI/BuoB,EAAQb,cAAc9mB,IAICqE,4BAACnN,GAC1B,OAAOW,EAAuBX,IAAYA,EAAQyD,WAGxB0J,6BAACjF,GAQ3B,GAAI,kBAAkB7F,KAAK6F,EAAMlC,OAAO2H,SAxY1B,UAyYZzF,EAAMsD,KA1YO,WA0YetD,EAAMsD,MAtYjB,cAuYftD,EAAMsD,KAxYO,YAwYmBtD,EAAMsD,KACtCtD,EAAMlC,OAAO4H,QApXC,oBAqXf6gB,GAAepsB,KAAK6F,EAAMsD,KAC3B,OAGF,MAAMolB,EAAW5nB,KAAKjG,UAAUC,SAhYZ,QAkYpB,IAAK4tB,GAnZU,WAmZE1oB,EAAMsD,IACrB,OAMF,GAHAtD,EAAMyD,iBACNzD,EAAM2oB,kBAEFjuB,EAAWoG,MACb,OAGF,MAAM8nB,EAAkB9nB,KAAKyH,QAvYJ,+BAuYoCzH,KAAOiH,EAAeW,KAAK5H,KAvY/D,+BAuY2F,GAC9GgD,EAAWmjB,GAASthB,oBAAoBijB,GAE9C,GAjae,WAiaX5oB,EAAMsD,IAKV,MAnaiB,YAmabtD,EAAMsD,KAlaS,cAkaetD,EAAMsD,KACjColB,GACH5kB,EAAS+L,YAGX/L,EAASskB,gBAAgBpoB,SAItB0oB,GA9aS,UA8aG1oB,EAAMsD,KACrB2jB,GAAS4B,cAdT/kB,EAAS8L,QAyBfxO,EAAaQ,GAAGrJ,SA7agB,+BASH,8BAoa2C0uB,GAAS6B,uBACjF1nB,EAAaQ,GAAGrJ,SA9agB,+BAUV,iBAoa2C0uB,GAAS6B,uBAC1E1nB,EAAaQ,GAAGrJ,SAhbc,6BAgbkB0uB,GAAS4B,YACzDznB,EAAaQ,GAAGrJ,SA/ac,6BA+akB0uB,GAAS4B,YACzDznB,EAAaQ,GAAGrJ,SAlbc,6BAUD,+BAwayC,SAAUyH,GAC9EA,EAAMyD,iBACNwjB,GAASthB,oBAAoB7E,MAAMqF,YAUrCjK,EAAmB+qB,IClenB,MAAM8B,GACJvkB,cACE1D,KAAK2D,SAAWlM,SAASuD,KAG3BktB,WAEE,MAAMC,EAAgB1wB,SAAS2C,gBAAgBwb,YAC/C,OAAOjY,KAAK4N,IAAIxQ,OAAOqtB,WAAaD,GAGtCrZ,OACE,MAAM0D,EAAQxS,KAAKkoB,WACnBloB,KAAKqoB,mBAELroB,KAAKsoB,sBAAsBtoB,KAAK2D,SAAU,eAAgB4kB,GAAmBA,EAAkB/V,GAE/FxS,KAAKsoB,sBApBsB,oDAoBwB,eAAgBC,GAAmBA,EAAkB/V,GACxGxS,KAAKsoB,sBApBuB,cAoBwB,cAAeC,GAAmBA,EAAkB/V,GAG1G6V,mBACEroB,KAAKwoB,sBAAsBxoB,KAAK2D,SAAU,YAC1C3D,KAAK2D,SAAS4L,MAAM4J,SAAW,SAGjCmP,sBAAsBrxB,EAAUwxB,EAAWntB,GACzC,MAAMotB,EAAiB1oB,KAAKkoB,WAW5BloB,KAAK2oB,2BAA2B1xB,EAVHD,IAC3B,GAAIA,IAAYgJ,KAAK2D,UAAY5I,OAAOqtB,WAAapxB,EAAQ4e,YAAc8S,EACzE,OAGF1oB,KAAKwoB,sBAAsBxxB,EAASyxB,GACpC,MAAMF,EAAkBxtB,OAAOrB,iBAAiB1C,GAASyxB,GACzDzxB,EAAQuY,MAAMkZ,GAAgBntB,EAASoB,OAAOC,WAAW4rB,IAA7B,OAMhCrJ,QACElf,KAAK4oB,wBAAwB5oB,KAAK2D,SAAU,YAC5C3D,KAAK4oB,wBAAwB5oB,KAAK2D,SAAU,gBAC5C3D,KAAK4oB,wBA/CsB,oDA+C0B,gBACrD5oB,KAAK4oB,wBA/CuB,cA+C0B,eAGxDJ,sBAAsBxxB,EAASyxB,GAC7B,MAAMI,EAAc7xB,EAAQuY,MAAMkZ,GAC9BI,GACFjjB,EAAYC,iBAAiB7O,EAASyxB,EAAWI,GAIrDD,wBAAwB3xB,EAAUwxB,GAWhCzoB,KAAK2oB,2BAA2B1xB,EAVHD,IAC3B,MAAM8B,EAAQ8M,EAAYU,iBAAiBtP,EAASyxB,QAC/B,IAAV3vB,EACT9B,EAAQuY,MAAMuZ,eAAeL,IAE7B7iB,EAAYE,oBAAoB9O,EAASyxB,GACzCzxB,EAAQuY,MAAMkZ,GAAa3vB,KAOjC6vB,2BAA2B1xB,EAAU8xB,GAC/BhxB,EAAUd,GACZ8xB,EAAS9xB,GAETgQ,EAAeC,KAAKjQ,EAAU+I,KAAK2D,UAAUhL,QAAQowB,GAIzDC,gBACE,OAAOhpB,KAAKkoB,WAAa,GClF7B,MAAM5f,GAAU,CACd2gB,UAAW,iBACXzvB,WAAW,EACX0K,YAAY,EACZglB,YAAa,OACbC,cAAe,MAGXtgB,GAAc,CAClBogB,UAAW,SACXzvB,UAAW,UACX0K,WAAY,UACZglB,YAAa,mBACbC,cAAe,mBAQjB,MAAMC,GACJ1lB,YAAYnL,GACVyH,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKqpB,aAAc,EACnBrpB,KAAK2D,SAAW,KAGlBoL,KAAKzT,GACE0E,KAAK+J,QAAQvQ,WAKlBwG,KAAKspB,UAEDtpB,KAAK+J,QAAQ7F,YACfvJ,EAAOqF,KAAKupB,eAGdvpB,KAAKupB,cAAcxvB,UAAUqS,IAvBT,QAyBpBpM,KAAKwpB,kBAAkB,KACrBttB,EAAQZ,MAbRY,EAAQZ,GAiBZwT,KAAKxT,GACE0E,KAAK+J,QAAQvQ,WAKlBwG,KAAKupB,cAAcxvB,UAAUwJ,OApCT,QAsCpBvD,KAAKwpB,kBAAkB,KACrBxpB,KAAK6D,UACL3H,EAAQZ,MARRY,EAAQZ,GAcZiuB,cACE,IAAKvpB,KAAK2D,SAAU,CAClB,MAAM8lB,EAAWhyB,SAASiyB,cAAc,OACxCD,EAASR,UAAYjpB,KAAK+J,QAAQkf,UAC9BjpB,KAAK+J,QAAQ7F,YACfulB,EAAS1vB,UAAUqS,IApDH,QAuDlBpM,KAAK2D,SAAW8lB,EAGlB,OAAOzpB,KAAK2D,SAGdqG,WAAWzR,GAST,OARAA,EAAS,IACJ+P,MACmB,iBAAX/P,EAAsBA,EAAS,KAIrC2wB,YAAc/wB,EAAWI,EAAO2wB,aACvC7wB,EAtES,WAsEaE,EAAQsQ,IACvBtQ,EAGT+wB,UACMtpB,KAAKqpB,cAITrpB,KAAK+J,QAAQmf,YAAYS,OAAO3pB,KAAKupB,eAErCjpB,EAAaQ,GAAGd,KAAKupB,cA7EA,wBA6EgC,KACnDrtB,EAAQ8D,KAAK+J,QAAQof,iBAGvBnpB,KAAKqpB,aAAc,GAGrBxlB,UACO7D,KAAKqpB,cAIV/oB,EAAaC,IAAIP,KAAK2D,SAzFD,yBA2FrB3D,KAAK2D,SAASJ,SACdvD,KAAKqpB,aAAc,GAGrBG,kBAAkBluB,GAChBa,EAAuBb,EAAU0E,KAAKupB,cAAevpB,KAAK+J,QAAQ7F,aClHtE,MAAMoE,GAAU,CACdshB,YAAa,KACbC,WAAW,GAGPhhB,GAAc,CAClB+gB,YAAa,UACbC,UAAW,WAab,MAAMC,GACJpmB,YAAYnL,GACVyH,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAK+pB,WAAY,EACjB/pB,KAAKgqB,qBAAuB,KAG9BC,WACE,MAAML,YAAEA,EAAFC,UAAeA,GAAc7pB,KAAK+J,QAEpC/J,KAAK+pB,YAILF,GACFD,EAAYjD,QAGdrmB,EAAaC,IAAI9I,SA1BF,iBA2Bf6I,EAAaQ,GAAGrJ,SA1BG,uBA0BsByH,GAASc,KAAKkqB,eAAehrB,IACtEoB,EAAaQ,GAAGrJ,SA1BO,2BA0BsByH,GAASc,KAAKmqB,eAAejrB,IAE1Ec,KAAK+pB,WAAY,GAGnBK,aACOpqB,KAAK+pB,YAIV/pB,KAAK+pB,WAAY,EACjBzpB,EAAaC,IAAI9I,SAvCF,kBA4CjByyB,eAAehrB,GACb,MAAMlC,OAAEA,GAAWkC,GACb0qB,YAAEA,GAAgB5pB,KAAK+J,QAE7B,GACE/M,IAAWvF,UACXuF,IAAW4sB,GACXA,EAAY5vB,SAASgD,GAErB,OAGF,MAAMoU,EAAWnK,EAAegB,kBAAkB2hB,GAE1B,IAApBxY,EAAShZ,OACXwxB,EAAYjD,QArDO,aAsDV3mB,KAAKgqB,qBACd5Y,EAASA,EAAShZ,OAAS,GAAGuuB,QAE9BvV,EAAS,GAAGuV,QAIhBwD,eAAejrB,GA/DD,QAgERA,EAAMsD,MAIVxC,KAAKgqB,qBAAuB9qB,EAAMmrB,SAlEb,WADD,WAsEtBrgB,WAAWzR,GAMT,OALAA,EAAS,IACJ+P,MACmB,iBAAX/P,EAAsBA,EAAS,IAE5CF,EAlFS,YAkFaE,EAAQsQ,IACvBtQ,GC1EX,MAMM+P,GAAU,CACdmhB,UAAU,EACVjhB,UAAU,EACVme,OAAO,GAGH9d,GAAc,CAClB4gB,SAAU,mBACVjhB,SAAU,UACVme,MAAO,WA8BT,MAAM2D,WAAc7mB,EAClBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKuqB,QAAUtjB,EAAeK,QAfV,gBAemCtH,KAAK2D,UAC5D3D,KAAKwqB,UAAYxqB,KAAKyqB,sBACtBzqB,KAAK0qB,WAAa1qB,KAAK2qB,uBACvB3qB,KAAK6O,UAAW,EAChB7O,KAAK4qB,sBAAuB,EAC5B5qB,KAAKoO,kBAAmB,EACxBpO,KAAK6qB,WAAa,IAAI5C,GAKN3f,qBAChB,OAAOA,GAGM7M,kBACb,MAlES,QAuEX4J,OAAOvF,GACL,OAAOE,KAAK6O,SAAW7O,KAAK8O,OAAS9O,KAAK+O,KAAKjP,GAGjDiP,KAAKjP,GACCE,KAAK6O,UAAY7O,KAAKoO,kBAIR9N,EAAamB,QAAQzB,KAAK2D,SA3D5B,gBA2DkD,CAChE7D,cAAAA,IAGYiC,mBAId/B,KAAK6O,UAAW,EAEZ7O,KAAK8qB,gBACP9qB,KAAKoO,kBAAmB,GAG1BpO,KAAK6qB,WAAW/b,OAEhBrX,SAASuD,KAAKjB,UAAUqS,IAlEJ,cAoEpBpM,KAAK+qB,gBAEL/qB,KAAKgrB,kBACLhrB,KAAKirB,kBAEL3qB,EAAaQ,GAAGd,KAAKuqB,QA5EQ,6BA4E0B,KACrDjqB,EAAaS,IAAIf,KAAK2D,SA9EG,2BA8E8BzE,IACjDA,EAAMlC,SAAWgD,KAAK2D,WACxB3D,KAAK4qB,sBAAuB,OAKlC5qB,KAAKkrB,cAAc,IAAMlrB,KAAKmrB,aAAarrB,KAG7CgP,OACE,IAAK9O,KAAK6O,UAAY7O,KAAKoO,iBACzB,OAKF,GAFkB9N,EAAamB,QAAQzB,KAAK2D,SArG5B,iBAuGF5B,iBACZ,OAGF/B,KAAK6O,UAAW,EAChB,MAAM3K,EAAalE,KAAK8qB,cAEpB5mB,IACFlE,KAAKoO,kBAAmB,GAG1BpO,KAAKgrB,kBACLhrB,KAAKirB,kBAELjrB,KAAK0qB,WAAWN,aAEhBpqB,KAAK2D,SAAS5J,UAAUwJ,OAzGJ,QA2GpBjD,EAAaC,IAAIP,KAAK2D,SAnHG,0BAoHzBrD,EAAaC,IAAIP,KAAKuqB,QAjHO,8BAmH7BvqB,KAAKiE,eAAe,IAAMjE,KAAKorB,aAAcprB,KAAK2D,SAAUO,GAG9DL,UACE,CAAC9I,OAAQiF,KAAKuqB,SACX5xB,QAAQ0yB,GAAe/qB,EAAaC,IAAI8qB,EAjJ5B,cAmJfrrB,KAAKwqB,UAAU3mB,UACf7D,KAAK0qB,WAAWN,aAChB9gB,MAAMzF,UAGRynB,eACEtrB,KAAK+qB,gBAKPN,sBACE,OAAO,IAAIrB,GAAS,CAClB5vB,UAAWqH,QAAQb,KAAK+J,QAAQ0f,UAChCvlB,WAAYlE,KAAK8qB,gBAIrBH,uBACE,OAAO,IAAIb,GAAU,CACnBF,YAAa5pB,KAAK2D,WAItBqG,WAAWzR,GAOT,OANAA,EAAS,IACJ+P,MACA1C,EAAYI,kBAAkBhG,KAAK2D,aAChB,iBAAXpL,EAAsBA,EAAS,IAE5CF,EAnLS,QAmLaE,EAAQsQ,IACvBtQ,EAGT4yB,aAAarrB,GACX,MAAMoE,EAAalE,KAAK8qB,cAClBS,EAAYtkB,EAAeK,QArJT,cAqJsCtH,KAAKuqB,SAE9DvqB,KAAK2D,SAASlJ,YAAcuF,KAAK2D,SAASlJ,WAAWvC,WAAa2B,KAAKC,cAE1ErC,SAASuD,KAAK2uB,OAAO3pB,KAAK2D,UAG5B3D,KAAK2D,SAAS4L,MAAMyW,QAAU,QAC9BhmB,KAAK2D,SAASoC,gBAAgB,eAC9B/F,KAAK2D,SAAS2B,aAAa,cAAc,GACzCtF,KAAK2D,SAAS2B,aAAa,OAAQ,UACnCtF,KAAK2D,SAASoV,UAAY,EAEtBwS,IACFA,EAAUxS,UAAY,GAGpB7U,GACFvJ,EAAOqF,KAAK2D,UAGd3D,KAAK2D,SAAS5J,UAAUqS,IA9KJ,QA2LpBpM,KAAKiE,eAXsB,KACrBjE,KAAK+J,QAAQ4c,OACf3mB,KAAK0qB,WAAWT,WAGlBjqB,KAAKoO,kBAAmB,EACxB9N,EAAamB,QAAQzB,KAAK2D,SAhMX,iBAgMkC,CAC/C7D,cAAAA,KAIoCE,KAAKuqB,QAASrmB,GAGxD8mB,kBACMhrB,KAAK6O,SACPvO,EAAaQ,GAAGd,KAAK2D,SAvMI,2BAuM6BzE,IAChDc,KAAK+J,QAAQvB,UA7NN,WA6NkBtJ,EAAMsD,KACjCtD,EAAMyD,iBACN3C,KAAK8O,QACK9O,KAAK+J,QAAQvB,UAhOd,WAgO0BtJ,EAAMsD,KACzCxC,KAAKwrB,+BAITlrB,EAAaC,IAAIP,KAAK2D,SAhNG,4BAoN7BsnB,kBACMjrB,KAAK6O,SACPvO,EAAaQ,GAAG/F,OAxNA,kBAwNsB,IAAMiF,KAAK+qB,iBAEjDzqB,EAAaC,IAAIxF,OA1ND,mBA8NpBqwB,aACEprB,KAAK2D,SAAS4L,MAAMyW,QAAU,OAC9BhmB,KAAK2D,SAAS2B,aAAa,eAAe,GAC1CtF,KAAK2D,SAASoC,gBAAgB,cAC9B/F,KAAK2D,SAASoC,gBAAgB,QAC9B/F,KAAKoO,kBAAmB,EACxBpO,KAAKwqB,UAAU1b,KAAK,KAClBrX,SAASuD,KAAKjB,UAAUwJ,OA9NN,cA+NlBvD,KAAKyrB,oBACLzrB,KAAK6qB,WAAW3L,QAChB5e,EAAamB,QAAQzB,KAAK2D,SA3OV,qBA+OpBunB,cAAc5vB,GACZgF,EAAaQ,GAAGd,KAAK2D,SA5OI,yBA4O2BzE,IAC9Cc,KAAK4qB,qBACP5qB,KAAK4qB,sBAAuB,EAI1B1rB,EAAMlC,SAAWkC,EAAMwsB,iBAIG,IAA1B1rB,KAAK+J,QAAQ0f,SACfzpB,KAAK8O,OAC8B,WAA1B9O,KAAK+J,QAAQ0f,UACtBzpB,KAAKwrB,gCAITxrB,KAAKwqB,UAAUzb,KAAKzT,GAGtBwvB,cACE,OAAO9qB,KAAK2D,SAAS5J,UAAUC,SA1PX,QA6PtBwxB,6BAEE,GADkBlrB,EAAamB,QAAQzB,KAAK2D,SA1QlB,0BA2QZ5B,iBACZ,OAGF,MAAMhI,UAAEA,EAAFugB,aAAaA,EAAb/K,MAA2BA,GAAUvP,KAAK2D,SAC1CgoB,EAAqBrR,EAAe7iB,SAAS2C,gBAAgBub,cAG7DgW,GAA0C,WAApBpc,EAAM8J,WAA2Btf,EAAUC,SArQjD,kBAyQjB2xB,IACHpc,EAAM8J,UAAY,UAGpBtf,EAAUqS,IA7QY,gBA8QtBpM,KAAKiE,eAAe,KAClBlK,EAAUwJ,OA/QU,gBAgRfooB,GACH3rB,KAAKiE,eAAe,KAClBsL,EAAM8J,UAAY,IACjBrZ,KAAKuqB,UAETvqB,KAAKuqB,SAERvqB,KAAK2D,SAASgjB,SAOhBoE,gBACE,MAAMY,EAAqB3rB,KAAK2D,SAAS2W,aAAe7iB,SAAS2C,gBAAgBub,aAC3E+S,EAAiB1oB,KAAK6qB,WAAW3C,WACjC0D,EAAoBlD,EAAiB,IAErCkD,GAAqBD,IAAuBzwB,KAAa0wB,IAAsBD,GAAsBzwB,OACzG8E,KAAK2D,SAAS4L,MAAMsc,YAAiBnD,EAAF,OAGhCkD,IAAsBD,IAAuBzwB,MAAc0wB,GAAqBD,GAAsBzwB,OACzG8E,KAAK2D,SAAS4L,MAAMuc,aAAkBpD,EAAF,MAIxC+C,oBACEzrB,KAAK2D,SAAS4L,MAAMsc,YAAc,GAClC7rB,KAAK2D,SAAS4L,MAAMuc,aAAe,GAKf3nB,uBAAC5L,EAAQuH,GAC7B,OAAOE,KAAKiF,MAAK,WACf,MAAMC,EAAOolB,GAAMzlB,oBAAoB7E,KAAMzH,GAE7C,GAAsB,iBAAXA,EAAX,CAIA,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,GAAQuH,QAWnBQ,EAAaQ,GAAGrJ,SA/Uc,0BASD,4BAsUyC,SAAUyH,GAC9E,MAAMlC,EAASrF,EAAuBqI,MAElC,CAAC,IAAK,QAAQ5I,SAAS4I,KAAK2E,UAC9BzF,EAAMyD,iBAGRrC,EAAaS,IAAI/D,EA7VC,gBA6VmB+uB,IAC/BA,EAAUhqB,kBAKdzB,EAAaS,IAAI/D,EApWC,kBAoWqB,KACjCxD,EAAUwG,OACZA,KAAK2mB,YAKE2D,GAAMzlB,oBAAoB7H,GAElCqI,OAAOrF,SAGduE,EAAqB+lB,IASrBlvB,EAAmBkvB,IC9YnB,MAOMhiB,GAAU,CACdmhB,UAAU,EACVjhB,UAAU,EACV2P,QAAQ,GAGJtP,GAAc,CAClB4gB,SAAU,UACVjhB,SAAU,UACV2P,OAAQ,WAsBV,MAAM6T,WAAkBvoB,EACtBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAK6O,UAAW,EAChB7O,KAAKwqB,UAAYxqB,KAAKyqB,sBACtBzqB,KAAK0qB,WAAa1qB,KAAK2qB,uBACvB3qB,KAAKuK,qBAKQ9O,kBACb,MApDS,YAuDO6M,qBAChB,OAAOA,GAKTjD,OAAOvF,GACL,OAAOE,KAAK6O,SAAW7O,KAAK8O,OAAS9O,KAAK+O,KAAKjP,GAGjDiP,KAAKjP,GACCE,KAAK6O,UAISvO,EAAamB,QAAQzB,KAAK2D,SA/C5B,oBA+CkD,CAAE7D,cAAAA,IAEtDiC,mBAId/B,KAAK6O,UAAW,EAChB7O,KAAK2D,SAAS4L,MAAM0c,WAAa,UAEjCjsB,KAAKwqB,UAAUzb,OAEV/O,KAAK+J,QAAQoO,SAChB,IAAI8P,IAAkBnZ,OAGxB9O,KAAK2D,SAASoC,gBAAgB,eAC9B/F,KAAK2D,SAAS2B,aAAa,cAAc,GACzCtF,KAAK2D,SAAS2B,aAAa,OAAQ,UACnCtF,KAAK2D,SAAS5J,UAAUqS,IArEJ,QA+EpBpM,KAAKiE,eARoB,KAClBjE,KAAK+J,QAAQoO,QAChBnY,KAAK0qB,WAAWT,WAGlB3pB,EAAamB,QAAQzB,KAAK2D,SAvEX,qBAuEkC,CAAE7D,cAAAA,KAGfE,KAAK2D,UAAU,IAGvDmL,OACO9O,KAAK6O,WAIQvO,EAAamB,QAAQzB,KAAK2D,SAjF5B,qBAmFF5B,mBAId/B,KAAK0qB,WAAWN,aAChBpqB,KAAK2D,SAASuoB,OACdlsB,KAAK6O,UAAW,EAChB7O,KAAK2D,SAAS5J,UAAUwJ,OAhGJ,QAiGpBvD,KAAKwqB,UAAU1b,OAef9O,KAAKiE,eAboB,KACvBjE,KAAK2D,SAAS2B,aAAa,eAAe,GAC1CtF,KAAK2D,SAASoC,gBAAgB,cAC9B/F,KAAK2D,SAASoC,gBAAgB,QAC9B/F,KAAK2D,SAAS4L,MAAM0c,WAAa,SAE5BjsB,KAAK+J,QAAQoO,SAChB,IAAI8P,IAAkB/I,QAGxB5e,EAAamB,QAAQzB,KAAK2D,SAtGV,wBAyGoB3D,KAAK2D,UAAU,KAGvDE,UACE7D,KAAKwqB,UAAU3mB,UACf7D,KAAK0qB,WAAWN,aAChB9gB,MAAMzF,UAKRmG,WAAWzR,GAOT,OANAA,EAAS,IACJ+P,MACA1C,EAAYI,kBAAkBhG,KAAK2D,aAChB,iBAAXpL,EAAsBA,EAAS,IAE5CF,EApJS,YAoJaE,EAAQsQ,IACvBtQ,EAGTkyB,sBACE,OAAO,IAAIrB,GAAS,CAClBH,UAtIsB,qBAuItBzvB,UAAWwG,KAAK+J,QAAQ0f,SACxBvlB,YAAY,EACZglB,YAAalpB,KAAK2D,SAASlJ,WAC3B0uB,cAAe,IAAMnpB,KAAK8O,SAI9B6b,uBACE,OAAO,IAAIb,GAAU,CACnBF,YAAa5pB,KAAK2D,WAItB4G,qBACEjK,EAAaQ,GAAGd,KAAK2D,SA7IM,+BA6I2BzE,IAChDc,KAAK+J,QAAQvB,UArKJ,WAqKgBtJ,EAAMsD,KACjCxC,KAAK8O,SAOW3K,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAO8mB,GAAUnnB,oBAAoB7E,KAAMzH,GAEjD,GAAsB,iBAAXA,EAAX,CAIA,QAAqB4M,IAAjBD,EAAK3M,IAAyBA,EAAOlB,WAAW,MAAmB,gBAAXkB,EAC1D,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,GAAQyH,WAWnBM,EAAaQ,GAAGrJ,SA9Kc,8BAGD,gCA2KyC,SAAUyH,GAC9E,MAAMlC,EAASrF,EAAuBqI,MAMtC,GAJI,CAAC,IAAK,QAAQ5I,SAAS4I,KAAK2E,UAC9BzF,EAAMyD,iBAGJ/I,EAAWoG,MACb,OAGFM,EAAaS,IAAI/D,EA1LG,sBA0LmB,KAEjCxD,EAAUwG,OACZA,KAAK2mB,UAKT,MAAMwF,EAAellB,EAAeK,QAvMhB,mBAwMhB6kB,GAAgBA,IAAiBnvB,GACnCgvB,GAAU5nB,YAAY+nB,GAAcrd,OAGzBkd,GAAUnnB,oBAAoB7H,GACtCqI,OAAOrF,SAGdM,EAAaQ,GAAG/F,OAjOa,6BAiOgB,IAC3CkM,EAAeC,KAjNK,mBAiNevO,QAAQ0P,GAAM2jB,GAAUnnB,oBAAoBwD,GAAI0G,SAGrFxK,EAAqBynB,IAOrB5wB,EAAmB4wB,ICtQnB,MAAMI,GAAW,IAAI5tB,IAAI,CACvB,aACA,OACA,OACA,WACA,WACA,SACA,MACA,eAUI6tB,GAAmB,6DAOnBC,GAAmB,qIAEnBC,GAAmB,CAACC,EAAMC,KAC9B,MAAMC,EAAWF,EAAKjc,SAASpX,cAE/B,GAAIszB,EAAqBr1B,SAASs1B,GAChC,OAAIN,GAAS1sB,IAAIgtB,IACR7rB,QAAQwrB,GAAiBhzB,KAAKmzB,EAAKG,YAAcL,GAAiBjzB,KAAKmzB,EAAKG,YAMvF,MAAMC,EAASH,EAAqBtmB,OAAO0mB,GAAaA,aAAqBzzB,QAG7E,IAAK,IAAI4F,EAAI,EAAGC,EAAM2tB,EAAOx0B,OAAQ4G,EAAIC,EAAKD,IAC5C,GAAI4tB,EAAO5tB,GAAG3F,KAAKqzB,GACjB,OAAO,EAIX,OAAO,GAqCF,SAASI,GAAaC,EAAYC,EAAWC,GAClD,IAAKF,EAAW30B,OACd,OAAO20B,EAGT,GAAIE,GAAoC,mBAAfA,EACvB,OAAOA,EAAWF,GAGpB,MACMG,GADY,IAAInyB,OAAOoyB,WACKC,gBAAgBL,EAAY,aACxDM,EAAgB50B,OAAOC,KAAKs0B,GAC5B5b,EAAW,GAAGjK,UAAU+lB,EAAgBlyB,KAAKqF,iBAAiB,MAEpE,IAAK,IAAIrB,EAAI,EAAGC,EAAMmS,EAAShZ,OAAQ4G,EAAIC,EAAKD,IAAK,CACnD,MAAMqJ,EAAK+I,EAASpS,GACdsuB,EAASjlB,EAAGkI,SAASpX,cAE3B,IAAKk0B,EAAcj2B,SAASk2B,GAAS,CACnCjlB,EAAG9E,SAEH,SAGF,MAAMgqB,EAAgB,GAAGpmB,UAAUkB,EAAGpC,YAChCunB,EAAoB,GAAGrmB,OAAO6lB,EAAU,MAAQ,GAAIA,EAAUM,IAAW,IAE/EC,EAAc50B,QAAQ6zB,IACfD,GAAiBC,EAAMgB,IAC1BnlB,EAAGtC,gBAAgBymB,EAAKjc,YAK9B,OAAO2c,EAAgBlyB,KAAKyyB,UC7F9B,MAIMC,GAAwB,IAAIlvB,IAAI,CAAC,WAAY,YAAa,eAE1DqK,GAAc,CAClB8kB,UAAW,UACXC,SAAU,SACVC,MAAO,4BACPpsB,QAAS,SACTqsB,MAAO,kBACP/T,KAAM,UACN9iB,SAAU,mBACVkZ,UAAW,oBACX5J,OAAQ,0BACR2I,UAAW,2BACX4O,mBAAoB,QACpB5C,SAAU,mBACV6S,YAAa,oBACbC,SAAU,UACVf,WAAY,kBACZD,UAAW,SACX/G,aAAc,0BAGVgI,GAAgB,CACpBC,KAAM,OACNC,IAAK,MACLC,MAAOlzB,IAAU,OAAS,QAC1BmzB,OAAQ,SACRC,KAAMpzB,IAAU,QAAU,QAGtBoN,GAAU,CACdqlB,WAAW,EACXC,SAAU,+GAIVnsB,QAAS,cACTosB,MAAO,GACPC,MAAO,EACP/T,MAAM,EACN9iB,UAAU,EACVkZ,UAAW,MACX5J,OAAQ,CAAC,EAAG,GACZ2I,WAAW,EACX4O,mBAAoB,CAAC,MAAO,QAAS,SAAU,QAC/C5C,SAAU,kBACV6S,YAAa,GACbC,UAAU,EACVf,WAAY,KACZD,UD5B8B,CAE9BuB,IAAK,CAAC,QAAS,MAAO,KAAM,OAAQ,OAzCP,kBA0C7BnR,EAAG,CAAC,SAAU,OAAQ,QAAS,OAC/BoR,KAAM,GACNnR,EAAG,GACHoR,GAAI,GACJC,IAAK,GACLC,KAAM,GACNC,IAAK,GACLC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJC,GAAI,GACJpwB,EAAG,GACHqwB,IAAK,CAAC,MAAO,SAAU,MAAO,QAAS,QAAS,UAChDC,GAAI,GACJC,GAAI,GACJC,EAAG,GACHC,IAAK,GACLC,EAAG,GACHC,MAAO,GACPC,KAAM,GACNC,IAAK,GACLC,IAAK,GACLC,OAAQ,GACRC,EAAG,GACHC,GAAI,ICFJhK,aAAc,MAGVnuB,GAAQ,CACZo4B,KAAO,kBACPC,OAAS,oBACTC,KAAO,kBACPC,MAAQ,mBACRC,SAAW,sBACXC,MAAQ,mBACRC,QAAU,qBACVC,SAAW,sBACXC,WAAa,wBACbC,WAAa,yBA0Bf,MAAMC,WAAgBntB,EACpBC,YAAY1M,EAASuB,GACnB,QAAsB,IAAXsuB,GACT,MAAM,IAAIvtB,UAAU,+DAGtBgQ,MAAMtS,GAGNgJ,KAAK6wB,YAAa,EAClB7wB,KAAK8wB,SAAW,EAChB9wB,KAAK+wB,YAAc,GACnB/wB,KAAKgxB,eAAiB,GACtBhxB,KAAKomB,QAAU,KAGfpmB,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKixB,IAAM,KAEXjxB,KAAKkxB,gBAKW5oB,qBAChB,OAAOA,GAGM7M,kBACb,MA1HS,UA6HK3D,mBACd,OAAOA,GAGa+Q,yBACpB,OAAOA,GAKTsoB,SACEnxB,KAAK6wB,YAAa,EAGpBO,UACEpxB,KAAK6wB,YAAa,EAGpBQ,gBACErxB,KAAK6wB,YAAc7wB,KAAK6wB,WAG1BxrB,OAAOnG,GACL,GAAKc,KAAK6wB,WAIV,GAAI3xB,EAAO,CACT,MAAMuoB,EAAUznB,KAAKsxB,6BAA6BpyB,GAElDuoB,EAAQuJ,eAAeO,OAAS9J,EAAQuJ,eAAeO,MAEnD9J,EAAQ+J,uBACV/J,EAAQgK,OAAO,KAAMhK,GAErBA,EAAQiK,OAAO,KAAMjK,OAElB,CACL,GAAIznB,KAAK2xB,gBAAgB53B,UAAUC,SA3FjB,QA6FhB,YADAgG,KAAK0xB,OAAO,KAAM1xB,MAIpBA,KAAKyxB,OAAO,KAAMzxB,OAItB6D,UACEoI,aAAajM,KAAK8wB,UAElBxwB,EAAaC,IAAIP,KAAK2D,SAASiB,QAjGX,UAEC,gBA+FqD5E,KAAK4xB,mBAE3E5xB,KAAKixB,KACPjxB,KAAKixB,IAAI1tB,SAGPvD,KAAKomB,SACPpmB,KAAKomB,QAAQjB,UAGf7b,MAAMzF,UAGRkL,OACE,GAAoC,SAAhC/O,KAAK2D,SAAS4L,MAAMyW,QACtB,MAAM,IAAI1hB,MAAM,uCAGlB,IAAMtE,KAAK6xB,kBAAmB7xB,KAAK6wB,WACjC,OAGF,MAAM9E,EAAYzrB,EAAamB,QAAQzB,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMs4B,MACvE0B,EAAa33B,EAAe6F,KAAK2D,UACjCouB,EAA4B,OAAfD,EACjB9xB,KAAK2D,SAAS+M,cAActW,gBAAgBJ,SAASgG,KAAK2D,UAC1DmuB,EAAW93B,SAASgG,KAAK2D,UAE3B,GAAIooB,EAAUhqB,mBAAqBgwB,EACjC,OAGF,MAAMd,EAAMjxB,KAAK2xB,gBACXK,EvEtNKC,CAAAA,IACb,GACEA,GAAUt0B,KAAKu0B,MArBH,IAqBSv0B,KAAKw0B,gBACnB16B,SAAS26B,eAAeH,IAEjC,OAAOA,GuEiNSI,CAAOryB,KAAK0D,YAAYjI,MAEtCw1B,EAAI3rB,aAAa,KAAM0sB,GACvBhyB,KAAK2D,SAAS2B,aAAa,mBAAoB0sB,GAE3ChyB,KAAK+J,QAAQ4jB,WACfsD,EAAIl3B,UAAUqS,IAhJI,QAmJpB,MAAM+D,EAA8C,mBAA3BnQ,KAAK+J,QAAQoG,UACpCnQ,KAAK+J,QAAQoG,UAAUlX,KAAK+G,KAAMixB,EAAKjxB,KAAK2D,UAC5C3D,KAAK+J,QAAQoG,UAETmiB,EAAatyB,KAAKuyB,eAAepiB,GACvCnQ,KAAKwyB,oBAAoBF,GAEzB,MAAMpjB,UAAEA,GAAclP,KAAK+J,QAC3BjH,EAAKC,IAAIkuB,EAAKjxB,KAAK0D,YAAYE,SAAU5D,MAEpCA,KAAK2D,SAAS+M,cAActW,gBAAgBJ,SAASgG,KAAKixB,OAC7D/hB,EAAUya,OAAOsH,GACjB3wB,EAAamB,QAAQzB,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMw4B,WAGzDtwB,KAAKomB,QACPpmB,KAAKomB,QAAQ5N,SAEbxY,KAAKomB,QAAUS,GAAoB7mB,KAAK2D,SAAUstB,EAAKjxB,KAAK8mB,iBAAiBwL,IAG/ErB,EAAIl3B,UAAUqS,IAtKM,QAwKpB,MAAM2hB,EAAc/tB,KAAKyyB,yBAAyBzyB,KAAK+J,QAAQgkB,aAC3DA,GACFkD,EAAIl3B,UAAUqS,OAAO2hB,EAAYz2B,MAAM,MAOrC,iBAAkBG,SAAS2C,iBAC7B,GAAG+M,UAAU1P,SAASuD,KAAKuM,UAAU5O,QAAQ3B,IAC3CsJ,EAAaQ,GAAG9J,EAAS,YAAa0D,KAI1C,MAWMwJ,EAAalE,KAAKixB,IAAIl3B,UAAUC,SApMlB,QAqMpBgG,KAAKiE,eAZY,KACf,MAAMyuB,EAAiB1yB,KAAK+wB,YAE5B/wB,KAAK+wB,YAAc,KACnBzwB,EAAamB,QAAQzB,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMu4B,OAxLzC,QA0LdqC,GACF1yB,KAAK0xB,OAAO,KAAM1xB,OAKQA,KAAKixB,IAAK/sB,GAG1C4K,OACE,IAAK9O,KAAKomB,QACR,OAGF,MAAM6K,EAAMjxB,KAAK2xB,gBAqBjB,GADkBrxB,EAAamB,QAAQzB,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMo4B,MAC/DnuB,iBACZ,OAGFkvB,EAAIl3B,UAAUwJ,OApOM,QAwOhB,iBAAkB9L,SAAS2C,iBAC7B,GAAG+M,UAAU1P,SAASuD,KAAKuM,UACxB5O,QAAQ3B,GAAWsJ,EAAaC,IAAIvJ,EAAS,YAAa0D,IAG/DsF,KAAKgxB,eAAL,OAAqC,EACrChxB,KAAKgxB,eAAL,OAAqC,EACrChxB,KAAKgxB,eAAL,OAAqC,EAErC,MAAM9sB,EAAalE,KAAKixB,IAAIl3B,UAAUC,SAnPlB,QAoPpBgG,KAAKiE,eAtCY,KACXjE,KAAKwxB,yBA3MU,SA+MfxxB,KAAK+wB,aACPE,EAAI1tB,SAGNvD,KAAK2yB,iBACL3yB,KAAK2D,SAASoC,gBAAgB,oBAC9BzF,EAAamB,QAAQzB,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMq4B,QAEvDnwB,KAAKomB,UACPpmB,KAAKomB,QAAQjB,UACbnlB,KAAKomB,QAAU,QAuBWpmB,KAAKixB,IAAK/sB,GACxClE,KAAK+wB,YAAc,GAGrBvY,SACuB,OAAjBxY,KAAKomB,SACPpmB,KAAKomB,QAAQ5N,SAMjBqZ,gBACE,OAAOhxB,QAAQb,KAAK4yB,YAGtBjB,gBACE,GAAI3xB,KAAKixB,IACP,OAAOjxB,KAAKixB,IAGd,MAAMj6B,EAAUS,SAASiyB,cAAc,OACvC1yB,EAAQy2B,UAAYztB,KAAK+J,QAAQ6jB,SAEjC,MAAMqD,EAAMj6B,EAAQuQ,SAAS,GAK7B,OAJAvH,KAAK6yB,WAAW5B,GAChBA,EAAIl3B,UAAUwJ,OA9QM,OAEA,QA8QpBvD,KAAKixB,IAAMA,EACJjxB,KAAKixB,IAGd4B,WAAW5B,GACTjxB,KAAK8yB,uBAAuB7B,EAAKjxB,KAAK4yB,WA9QX,kBAiR7BE,uBAAuBlF,EAAUmF,EAAS97B,GACxC,MAAM+7B,EAAkB/rB,EAAeK,QAAQrQ,EAAU22B,GAEpDmF,IAAWC,EAMhBhzB,KAAKizB,kBAAkBD,EAAiBD,GALtCC,EAAgBzvB,SAQpB0vB,kBAAkBj8B,EAAS+7B,GACzB,GAAgB,OAAZ/7B,EAIJ,OAAIe,EAAUg7B,IACZA,EAAU56B,EAAW46B,QAGjB/yB,KAAK+J,QAAQgQ,KACXgZ,EAAQt4B,aAAezD,IACzBA,EAAQy2B,UAAY,GACpBz2B,EAAQ2yB,OAAOoJ,IAGjB/7B,EAAQk8B,YAAcH,EAAQG,mBAM9BlzB,KAAK+J,QAAQgQ,MACX/Z,KAAK+J,QAAQikB,WACf+E,EAAUjG,GAAaiG,EAAS/yB,KAAK+J,QAAQijB,UAAWhtB,KAAK+J,QAAQkjB,aAGvEj2B,EAAQy2B,UAAYsF,GAEpB/7B,EAAQk8B,YAAcH,GAI1BH,WACE,MAAM/E,EAAQ7tB,KAAK2D,SAASzM,aAAa,2BAA6B8I,KAAK+J,QAAQ8jB,MAEnF,OAAO7tB,KAAKyyB,yBAAyB5E,GAGvCsF,iBAAiBb,GACf,MAAmB,UAAfA,EACK,MAGU,SAAfA,EACK,QAGFA,EAKThB,6BAA6BpyB,EAAOuoB,GAClC,OAAOA,GAAWznB,KAAK0D,YAAYmB,oBAAoB3F,EAAMa,eAAgBC,KAAKozB,sBAGpFjM,aACE,MAAM5gB,OAAEA,GAAWvG,KAAK+J,QAExB,MAAsB,iBAAXxD,EACFA,EAAOjP,MAAM,KAAK6Q,IAAI3C,GAAO9I,OAAOoQ,SAAStH,EAAK,KAGrC,mBAAXe,EACF6gB,GAAc7gB,EAAO6gB,EAAYpnB,KAAK2D,UAGxC4C,EAGTksB,yBAAyBM,GACvB,MAA0B,mBAAZA,EAAyBA,EAAQ95B,KAAK+G,KAAK2D,UAAYovB,EAGvEjM,iBAAiBwL,GACf,MAAMjL,EAAwB,CAC5BlX,UAAWmiB,EACXxP,UAAW,CACT,CACEtnB,KAAM,OACNmW,QAAS,CACPmM,mBAAoB9d,KAAK+J,QAAQ+T,qBAGrC,CACEtiB,KAAM,SACNmW,QAAS,CACPpL,OAAQvG,KAAKmnB,eAGjB,CACE3rB,KAAM,kBACNmW,QAAS,CACPuJ,SAAUlb,KAAK+J,QAAQmR,WAG3B,CACE1f,KAAM,QACNmW,QAAS,CACP3a,QAAU,IAAGgJ,KAAK0D,YAAYjI,eAGlC,CACED,KAAM,WACNwV,SAAS,EACTC,MAAO,aACPtV,GAAIuJ,GAAQlF,KAAKqzB,6BAA6BnuB,KAGlDkgB,cAAelgB,IACTA,EAAKyM,QAAQxB,YAAcjL,EAAKiL,WAClCnQ,KAAKqzB,6BAA6BnuB,KAKxC,MAAO,IACFmiB,KACsC,mBAA9BrnB,KAAK+J,QAAQkc,aAA8BjmB,KAAK+J,QAAQkc,aAAaoB,GAAyBrnB,KAAK+J,QAAQkc,cAI1HuM,oBAAoBF,GAClBtyB,KAAK2xB,gBAAgB53B,UAAUqS,IAAK,GAAEpM,KAAKszB,0BAA0BtzB,KAAKmzB,iBAAiBb,MAG7FC,eAAepiB,GACb,OAAO8d,GAAc9d,EAAU5W,eAGjC23B,gBACmBlxB,KAAK+J,QAAQtI,QAAQnK,MAAM,KAEnCqB,QAAQ8I,IACf,GAAgB,UAAZA,EACFnB,EAAaQ,GAAGd,KAAK2D,SAAU3D,KAAK0D,YAAY5L,MAAMy4B,MAAOvwB,KAAK+J,QAAQ9S,SAAUiI,GAASc,KAAKqF,OAAOnG,SACpG,GA7ZU,WA6ZNuC,EAA4B,CACrC,MAAM8xB,EAjaQ,UAiaE9xB,EACdzB,KAAK0D,YAAY5L,MAAM44B,WACvB1wB,KAAK0D,YAAY5L,MAAM04B,QACnBgD,EApaQ,UAoaG/xB,EACfzB,KAAK0D,YAAY5L,MAAM64B,WACvB3wB,KAAK0D,YAAY5L,MAAM24B,SAEzBnwB,EAAaQ,GAAGd,KAAK2D,SAAU4vB,EAASvzB,KAAK+J,QAAQ9S,SAAUiI,GAASc,KAAKyxB,OAAOvyB,IACpFoB,EAAaQ,GAAGd,KAAK2D,SAAU6vB,EAAUxzB,KAAK+J,QAAQ9S,SAAUiI,GAASc,KAAK0xB,OAAOxyB,OAIzFc,KAAK4xB,kBAAoB,KACnB5xB,KAAK2D,UACP3D,KAAK8O,QAITxO,EAAaQ,GAAGd,KAAK2D,SAASiB,QAvbV,UAEC,gBAqboD5E,KAAK4xB,mBAE1E5xB,KAAK+J,QAAQ9S,SACf+I,KAAK+J,QAAU,IACV/J,KAAK+J,QACRtI,QAAS,SACTxK,SAAU,IAGZ+I,KAAKyzB,YAITA,YACE,MAAM5F,EAAQ7tB,KAAK2D,SAASzM,aAAa,SACnCw8B,SAA2B1zB,KAAK2D,SAASzM,aAAa,2BAExD22B,GAA+B,WAAtB6F,KACX1zB,KAAK2D,SAAS2B,aAAa,yBAA0BuoB,GAAS,KAC1DA,GAAU7tB,KAAK2D,SAASzM,aAAa,eAAkB8I,KAAK2D,SAASuvB,aACvElzB,KAAK2D,SAAS2B,aAAa,aAAcuoB,GAG3C7tB,KAAK2D,SAAS2B,aAAa,QAAS,KAIxCmsB,OAAOvyB,EAAOuoB,GACZA,EAAUznB,KAAKsxB,6BAA6BpyB,EAAOuoB,GAE/CvoB,IACFuoB,EAAQuJ,eACS,YAAf9xB,EAAMsB,KAldQ,QADA,UAodZ,GAGFinB,EAAQkK,gBAAgB53B,UAAUC,SAjelB,SAEC,SA+d8CytB,EAAQsJ,YACzEtJ,EAAQsJ,YAheW,QAoerB9kB,aAAawb,EAAQqJ,UAErBrJ,EAAQsJ,YAtea,OAwehBtJ,EAAQ1d,QAAQ+jB,OAAUrG,EAAQ1d,QAAQ+jB,MAAM/e,KAKrD0Y,EAAQqJ,SAAW5zB,WAAW,KA7eT,SA8efuqB,EAAQsJ,aACVtJ,EAAQ1Y,QAET0Y,EAAQ1d,QAAQ+jB,MAAM/e,MARvB0Y,EAAQ1Y,QAWZ2iB,OAAOxyB,EAAOuoB,GACZA,EAAUznB,KAAKsxB,6BAA6BpyB,EAAOuoB,GAE/CvoB,IACFuoB,EAAQuJ,eACS,aAAf9xB,EAAMsB,KAhfQ,QADA,SAkfZinB,EAAQ9jB,SAAS3J,SAASkF,EAAMY,gBAGlC2nB,EAAQ+J,yBAIZvlB,aAAawb,EAAQqJ,UAErBrJ,EAAQsJ,YAlgBY,MAogBftJ,EAAQ1d,QAAQ+jB,OAAUrG,EAAQ1d,QAAQ+jB,MAAMhf,KAKrD2Y,EAAQqJ,SAAW5zB,WAAW,KAzgBV,QA0gBduqB,EAAQsJ,aACVtJ,EAAQ3Y,QAET2Y,EAAQ1d,QAAQ+jB,MAAMhf,MARvB2Y,EAAQ3Y,QAWZ0iB,uBACE,IAAK,MAAM/vB,KAAWzB,KAAKgxB,eACzB,GAAIhxB,KAAKgxB,eAAevvB,GACtB,OAAO,EAIX,OAAO,EAGTuI,WAAWzR,GACT,MAAMo7B,EAAiB/tB,EAAYI,kBAAkBhG,KAAK2D,UAqC1D,OAnCAlL,OAAOC,KAAKi7B,GAAgBh7B,QAAQi7B,IAC9BlG,GAAsBhuB,IAAIk0B,WACrBD,EAAeC,MAI1Br7B,EAAS,IACJyH,KAAK0D,YAAY4E,WACjBqrB,KACmB,iBAAXp7B,GAAuBA,EAASA,EAAS,KAG/C2W,WAAiC,IAArB3W,EAAO2W,UAAsBzX,SAASuD,KAAO7C,EAAWI,EAAO2W,WAEtD,iBAAjB3W,EAAOu1B,QAChBv1B,EAAOu1B,MAAQ,CACb/e,KAAMxW,EAAOu1B,MACbhf,KAAMvW,EAAOu1B,QAIW,iBAAjBv1B,EAAOs1B,QAChBt1B,EAAOs1B,MAAQt1B,EAAOs1B,MAAM70B,YAGA,iBAAnBT,EAAOw6B,UAChBx6B,EAAOw6B,QAAUx6B,EAAOw6B,QAAQ/5B,YAGlCX,EAroBS,UAqoBaE,EAAQyH,KAAK0D,YAAYmF,aAE3CtQ,EAAOy1B,WACTz1B,EAAOq1B,SAAWd,GAAav0B,EAAOq1B,SAAUr1B,EAAOy0B,UAAWz0B,EAAO00B,aAGpE10B,EAGT66B,qBACE,MAAM76B,EAAS,GAEf,IAAK,MAAMiK,KAAOxC,KAAK+J,QACjB/J,KAAK0D,YAAY4E,QAAQ9F,KAASxC,KAAK+J,QAAQvH,KACjDjK,EAAOiK,GAAOxC,KAAK+J,QAAQvH,IAO/B,OAAOjK,EAGTo6B,iBACE,MAAM1B,EAAMjxB,KAAK2xB,gBACXkC,EAAwB,IAAIz6B,OAAQ,UAAS4G,KAAKszB,6BAA8B,KAChFQ,EAAW7C,EAAI/5B,aAAa,SAASgC,MAAM26B,GAChC,OAAbC,GAAqBA,EAAS17B,OAAS,GACzC07B,EAAS3rB,IAAI4rB,GAASA,EAAMx8B,QACzBoB,QAAQq7B,GAAU/C,EAAIl3B,UAAUwJ,OAAOywB,IAI9CV,uBACE,MArqBiB,aAwqBnBD,6BAA6BjM,GAC3B,MAAMjW,MAAEA,GAAUiW,EAEbjW,IAILnR,KAAKixB,IAAM9f,EAAMC,SAASM,OAC1B1R,KAAK2yB,iBACL3yB,KAAKwyB,oBAAoBxyB,KAAKuyB,eAAephB,EAAMhB,aAK/BhM,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAO0rB,GAAQ/rB,oBAAoB7E,KAAMzH,GAE/C,GAAsB,iBAAXA,EAAqB,CAC9B,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,UAab6C,EAAmBw1B,IC/tBnB,MAKMtoB,GAAU,IACXsoB,GAAQtoB,QACX6H,UAAW,QACX5J,OAAQ,CAAC,EAAG,GACZ9E,QAAS,QACTsxB,QAAS,GACTnF,SAAU,+IAON/kB,GAAc,IACf+nB,GAAQ/nB,YACXkqB,QAAS,6BAGLj7B,GAAQ,CACZo4B,KAAO,kBACPC,OAAS,oBACTC,KAAO,kBACPC,MAAQ,mBACRC,SAAW,sBACXC,MAAQ,mBACRC,QAAU,qBACVC,SAAW,sBACXC,WAAa,wBACbC,WAAa,yBAYf,MAAMsD,WAAgBrD,GAGFtoB,qBAChB,OAAOA,GAGM7M,kBACb,MArDS,UAwDK3D,mBACd,OAAOA,GAGa+Q,yBACpB,OAAOA,GAKTgpB,gBACE,OAAO7xB,KAAK4yB,YAAc5yB,KAAKk0B,cAGjCrB,WAAW5B,GACTjxB,KAAK8yB,uBAAuB7B,EAAKjxB,KAAK4yB,WAnCnB,mBAoCnB5yB,KAAK8yB,uBAAuB7B,EAAKjxB,KAAKk0B,cAnCjB,iBAwCvBA,cACE,OAAOl0B,KAAKyyB,yBAAyBzyB,KAAK+J,QAAQgpB,SAGpDO,uBACE,MA/EiB,aAoFGnvB,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAO+uB,GAAQpvB,oBAAoB7E,KAAMzH,GAE/C,GAAsB,iBAAXA,EAAqB,CAC9B,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,UAab6C,EAAmB64B,ICrGnB,MAKM3rB,GAAU,CACd/B,OAAQ,GACR9B,OAAQ,OACRzH,OAAQ,IAGJ6L,GAAc,CAClBtC,OAAQ,SACR9B,OAAQ,SACRzH,OAAQ,oBAeJm3B,GAAuB,8CAa7B,MAAMC,WAAkB3wB,EACtBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GACNgJ,KAAKq0B,eAA2C,SAA1Br0B,KAAK2D,SAASgB,QAAqB5J,OAASiF,KAAK2D,SACvE3D,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAKs0B,SAAW,GAChBt0B,KAAKu0B,SAAW,GAChBv0B,KAAKw0B,cAAgB,KACrBx0B,KAAKy0B,cAAgB,EAErBn0B,EAAaQ,GAAGd,KAAKq0B,eAlCH,sBAkCiC,IAAMr0B,KAAK00B,YAE9D10B,KAAK20B,UACL30B,KAAK00B,WAKWpsB,qBAChB,OAAOA,GAGM7M,kBACb,MAjES,YAsEXk5B,UACE,MAAMC,EAAa50B,KAAKq0B,iBAAmBr0B,KAAKq0B,eAAet5B,OAtC7C,SACE,WAyCd85B,EAAuC,SAAxB70B,KAAK+J,QAAQtF,OAChCmwB,EACA50B,KAAK+J,QAAQtF,OAETqwB,EA7Cc,aA6CDD,EACjB70B,KAAK+0B,gBACL,EAEF/0B,KAAKs0B,SAAW,GAChBt0B,KAAKu0B,SAAW,GAChBv0B,KAAKy0B,cAAgBz0B,KAAKg1B,mBAEV/tB,EAAeC,KAAKitB,GAAqBn0B,KAAK+J,QAAQ/M,QAE9DmL,IAAInR,IACV,MAAMi+B,EAAiBz9B,EAAuBR,GACxCgG,EAASi4B,EAAiBhuB,EAAeK,QAAQ2tB,GAAkB,KAEzE,GAAIj4B,EAAQ,CACV,MAAMk4B,EAAYl4B,EAAOyJ,wBACzB,GAAIyuB,EAAU1iB,OAAS0iB,EAAUxiB,OAC/B,MAAO,CACL9M,EAAYivB,GAAc73B,GAAQ0J,IAAMouB,EACxCG,GAKN,OAAO,OAEN9uB,OAAOgvB,GAAQA,GACfhY,KAAK,CAACC,EAAGC,IAAMD,EAAE,GAAKC,EAAE,IACxB1kB,QAAQw8B,IACPn1B,KAAKs0B,SAASr4B,KAAKk5B,EAAK,IACxBn1B,KAAKu0B,SAASt4B,KAAKk5B,EAAK,MAI9BtxB,UACEvD,EAAaC,IAAIP,KAAKq0B,eAhHP,iBAiHf/qB,MAAMzF,UAKRmG,WAAWzR,GAWT,OAVAA,EAAS,IACJ+P,MACA1C,EAAYI,kBAAkBhG,KAAK2D,aAChB,iBAAXpL,GAAuBA,EAASA,EAAS,KAG/CyE,OAAS7E,EAAWI,EAAOyE,SAAWvF,SAAS2C,gBAEtD/B,EAjIS,YAiIaE,EAAQsQ,IAEvBtQ,EAGTw8B,gBACE,OAAO/0B,KAAKq0B,iBAAmBt5B,OAC7BiF,KAAKq0B,eAAe1tB,YACpB3G,KAAKq0B,eAAetb,UAGxBic,mBACE,OAAOh1B,KAAKq0B,eAAe/Z,cAAgB3c,KAAKC,IAC9CnG,SAASuD,KAAKsf,aACd7iB,SAAS2C,gBAAgBkgB,cAI7B8a,mBACE,OAAOp1B,KAAKq0B,iBAAmBt5B,OAC7BA,OAAOs6B,YACPr1B,KAAKq0B,eAAe5tB,wBAAwBiM,OAGhDgiB,WACE,MAAM3b,EAAY/Y,KAAK+0B,gBAAkB/0B,KAAK+J,QAAQxD,OAChD+T,EAAeta,KAAKg1B,mBACpBM,EAAYt1B,KAAK+J,QAAQxD,OAAS+T,EAAeta,KAAKo1B,mBAM5D,GAJIp1B,KAAKy0B,gBAAkBna,GACzBta,KAAK20B,UAGH5b,GAAauc,EAAjB,CACE,MAAMt4B,EAASgD,KAAKu0B,SAASv0B,KAAKu0B,SAASn8B,OAAS,GAEhD4H,KAAKw0B,gBAAkBx3B,GACzBgD,KAAKu1B,UAAUv4B,OAJnB,CAUA,GAAIgD,KAAKw0B,eAAiBzb,EAAY/Y,KAAKs0B,SAAS,IAAMt0B,KAAKs0B,SAAS,GAAK,EAG3E,OAFAt0B,KAAKw0B,cAAgB,UACrBx0B,KAAKw1B,SAIP,IAAK,IAAIx2B,EAAIgB,KAAKs0B,SAASl8B,OAAQ4G,KACVgB,KAAKw0B,gBAAkBx0B,KAAKu0B,SAASv1B,IACxD+Z,GAAa/Y,KAAKs0B,SAASt1B,UACM,IAAzBgB,KAAKs0B,SAASt1B,EAAI,IAAsB+Z,EAAY/Y,KAAKs0B,SAASt1B,EAAI,KAGhFgB,KAAKu1B,UAAUv1B,KAAKu0B,SAASv1B,KAKnCu2B,UAAUv4B,GACRgD,KAAKw0B,cAAgBx3B,EAErBgD,KAAKw1B,SAEL,MAAMC,EAAUtB,GAAoB78B,MAAM,KACvC6Q,IAAIlR,GAAa,GAAEA,qBAA4B+F,OAAY/F,WAAkB+F,OAE1E04B,EAAOzuB,EAAeK,QAAQmuB,EAAQrtB,KAAK,KAAMpI,KAAK+J,QAAQ/M,QAEpE04B,EAAK37B,UAAUqS,IAjLO,UAkLlBspB,EAAK37B,UAAUC,SAnLU,iBAoL3BiN,EAAeK,QA1KY,mBA0KsBouB,EAAK9wB,QA3KlC,cA4KjB7K,UAAUqS,IApLO,UAsLpBnF,EAAeS,QAAQguB,EAnLG,qBAoLvB/8B,QAAQg9B,IAGP1uB,EAAeW,KAAK+tB,EAAY,+BAC7Bh9B,QAAQw8B,GAAQA,EAAKp7B,UAAUqS,IA3LlB,WA8LhBnF,EAAeW,KAAK+tB,EAzLH,aA0Ldh9B,QAAQi9B,IACP3uB,EAAeM,SAASquB,EA5LX,aA6LVj9B,QAAQw8B,GAAQA,EAAKp7B,UAAUqS,IAjMtB,eAsMtB9L,EAAamB,QAAQzB,KAAKq0B,eA3MN,wBA2MsC,CACxDv0B,cAAe9C,IAInBw4B,SACEvuB,EAAeC,KAAKitB,GAAqBn0B,KAAK+J,QAAQ/M,QACnDmJ,OAAOsK,GAAQA,EAAK1W,UAAUC,SA7MX,WA8MnBrB,QAAQ8X,GAAQA,EAAK1W,UAAUwJ,OA9MZ,WAmNFY,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAOkvB,GAAUvvB,oBAAoB7E,KAAMzH,GAEjD,GAAsB,iBAAXA,EAAX,CAIA,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,UAWX+H,EAAaQ,GAAG/F,OA7Oa,6BA6OgB,KAC3CkM,EAAeC,KAzOS,0BA0OrBvO,QAAQk9B,GAAO,IAAIzB,GAAUyB,MAUlCz6B,EAAmBg5B,IC/OnB,MAAM0B,WAAYryB,EAGDhI,kBACb,MAlCS,MAuCXsT,OACE,GAAK/O,KAAK2D,SAASlJ,YACjBuF,KAAK2D,SAASlJ,WAAWvC,WAAa2B,KAAKC,cAC3CkG,KAAK2D,SAAS5J,UAAUC,SA9BJ,UA+BpB,OAGF,IAAI6N,EACJ,MAAM7K,EAASrF,EAAuBqI,KAAK2D,UACrCoyB,EAAc/1B,KAAK2D,SAASiB,QA/BN,qBAiC5B,GAAImxB,EAAa,CACf,MAAMC,EAAwC,OAAzBD,EAAYxlB,UAA8C,OAAzBwlB,EAAYxlB,SAhC7C,wBADH,UAkClB1I,EAAWZ,EAAeC,KAAK8uB,EAAcD,GAC7CluB,EAAWA,EAASA,EAASzP,OAAS,GAGxC,MAAM69B,EAAYpuB,EAChBvH,EAAamB,QAAQoG,EApDP,cAoD6B,CACzC/H,cAAeE,KAAK2D,WAEtB,KAMF,GAJkBrD,EAAamB,QAAQzB,KAAK2D,SAvD5B,cAuDkD,CAChE7D,cAAe+H,IAGH9F,kBAAmC,OAAdk0B,GAAsBA,EAAUl0B,iBACjE,OAGF/B,KAAKu1B,UAAUv1B,KAAK2D,SAAUoyB,GAE9B,MAAMG,EAAW,KACf51B,EAAamB,QAAQoG,EAnEL,gBAmE6B,CAC3C/H,cAAeE,KAAK2D,WAEtBrD,EAAamB,QAAQzB,KAAK2D,SApEX,eAoEkC,CAC/C7D,cAAe+H,KAIf7K,EACFgD,KAAKu1B,UAAUv4B,EAAQA,EAAOvC,WAAYy7B,GAE1CA,IAMJX,UAAUv+B,EAASkY,EAAW5T,GAC5B,MAIM66B,IAJiBjnB,GAAqC,OAAvBA,EAAUqB,UAA4C,OAAvBrB,EAAUqB,SAE5EtJ,EAAeM,SAAS2H,EA3EN,WA0ElBjI,EAAeC,KAzEM,wBAyEmBgI,IAGZ,GACxBknB,EAAkB96B,GAAa66B,GAAUA,EAAOp8B,UAAUC,SAnF5C,QAqFdk8B,EAAW,IAAMl2B,KAAKq2B,oBAAoBr/B,EAASm/B,EAAQ76B,GAE7D66B,GAAUC,GACZD,EAAOp8B,UAAUwJ,OAvFC,QAwFlBvD,KAAKiE,eAAeiyB,EAAUl/B,GAAS,IAEvCk/B,IAIJG,oBAAoBr/B,EAASm/B,EAAQ76B,GACnC,GAAI66B,EAAQ,CACVA,EAAOp8B,UAAUwJ,OAlGG,UAoGpB,MAAM+yB,EAAgBrvB,EAAeK,QA1FJ,kCA0F4C6uB,EAAO17B,YAEhF67B,GACFA,EAAcv8B,UAAUwJ,OAvGN,UA0GgB,QAAhC4yB,EAAOj/B,aAAa,SACtBi/B,EAAO7wB,aAAa,iBAAiB,GAIzCtO,EAAQ+C,UAAUqS,IA/GI,UAgHe,QAAjCpV,EAAQE,aAAa,SACvBF,EAAQsO,aAAa,iBAAiB,GAGxC3K,EAAO3D,GAEHA,EAAQ+C,UAAUC,SArHF,SAsHlBhD,EAAQ+C,UAAUqS,IArHA,QAwHpB,IAAI8B,EAASlX,EAAQyD,WAKrB,GAJIyT,GAA8B,OAApBA,EAAOqC,WACnBrC,EAASA,EAAOzT,YAGdyT,GAAUA,EAAOnU,UAAUC,SAhIF,iBAgIsC,CACjE,MAAMu8B,EAAkBv/B,EAAQ4N,QA5HZ,aA8HhB2xB,GACFtvB,EAAeC,KA1HU,mBA0HqBqvB,GAC3C59B,QAAQ69B,GAAYA,EAASz8B,UAAUqS,IApIxB,WAuIpBpV,EAAQsO,aAAa,iBAAiB,GAGpChK,GACFA,IAMkB6I,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAO4wB,GAAIjxB,oBAAoB7E,MAErC,GAAsB,iBAAXzH,EAAqB,CAC9B,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,UAYb+H,EAAaQ,GAAGrJ,SAzKc,wBAWD,4EA8JyC,SAAUyH,GAC1E,CAAC,IAAK,QAAQ9H,SAAS4I,KAAK2E,UAC9BzF,EAAMyD,iBAGJ/I,EAAWoG,OAIF81B,GAAIjxB,oBAAoB7E,MAChC+O,UAUP3T,EAAmB06B,ICtMnB,MAkBMjtB,GAAc,CAClB8kB,UAAW,UACX8I,SAAU,UACV3I,MAAO,UAGHxlB,GAAU,CACdqlB,WAAW,EACX8I,UAAU,EACV3I,MAAO,KAST,MAAM4I,WAAcjzB,EAClBC,YAAY1M,EAASuB,GACnB+Q,MAAMtS,GAENgJ,KAAK+J,QAAU/J,KAAKgK,WAAWzR,GAC/ByH,KAAK8wB,SAAW,KAChB9wB,KAAK22B,sBAAuB,EAC5B32B,KAAK42B,yBAA0B,EAC/B52B,KAAKkxB,gBAKeroB,yBACpB,OAAOA,GAGSP,qBAChB,OAAOA,GAGM7M,kBACb,MA1DS,QA+DXsT,OACoBzO,EAAamB,QAAQzB,KAAK2D,SAtD5B,iBAwDF5B,mBAId/B,KAAK62B,gBAED72B,KAAK+J,QAAQ4jB,WACf3tB,KAAK2D,SAAS5J,UAAUqS,IA5DN,QAsEpBpM,KAAK2D,SAAS5J,UAAUwJ,OArEJ,QAsEpB5I,EAAOqF,KAAK2D,UACZ3D,KAAK2D,SAAS5J,UAAUqS,IAtEJ,QAuEpBpM,KAAK2D,SAAS5J,UAAUqS,IAtED,WAwEvBpM,KAAKiE,eAZY,KACfjE,KAAK2D,SAAS5J,UAAUwJ,OA7DH,WA8DrBjD,EAAamB,QAAQzB,KAAK2D,SAnEX,kBAqEf3D,KAAK82B,sBAQuB92B,KAAK2D,SAAU3D,KAAK+J,QAAQ4jB,YAG5D7e,OACO9O,KAAK2D,SAAS5J,UAAUC,SA7ET,UAiFFsG,EAAamB,QAAQzB,KAAK2D,SAxF5B,iBA0FF5B,mBAWd/B,KAAK2D,SAAS5J,UAAUqS,IA7FD,WA8FvBpM,KAAKiE,eARY,KACfjE,KAAK2D,SAAS5J,UAAUqS,IAzFN,QA0FlBpM,KAAK2D,SAAS5J,UAAUwJ,OAxFH,WAyFrBvD,KAAK2D,SAAS5J,UAAUwJ,OA1FN,QA2FlBjD,EAAamB,QAAQzB,KAAK2D,SAjGV,oBAqGY3D,KAAK2D,SAAU3D,KAAK+J,QAAQ4jB,aAG5D9pB,UACE7D,KAAK62B,gBAED72B,KAAK2D,SAAS5J,UAAUC,SArGR,SAsGlBgG,KAAK2D,SAAS5J,UAAUwJ,OAtGN,QAyGpB+F,MAAMzF,UAKRmG,WAAWzR,GAST,OARAA,EAAS,IACJ+P,MACA1C,EAAYI,kBAAkBhG,KAAK2D,aAChB,iBAAXpL,GAAuBA,EAASA,EAAS,IAGtDF,EApIS,QAoIaE,EAAQyH,KAAK0D,YAAYmF,aAExCtQ,EAGTu+B,qBACO92B,KAAK+J,QAAQ0sB,WAIdz2B,KAAK22B,sBAAwB32B,KAAK42B,0BAItC52B,KAAK8wB,SAAW5zB,WAAW,KACzB8C,KAAK8O,QACJ9O,KAAK+J,QAAQ+jB,SAGlBiJ,eAAe73B,EAAO83B,GACpB,OAAQ93B,EAAMsB,MACZ,IAAK,YACL,IAAK,WACHR,KAAK22B,qBAAuBK,EAC5B,MACF,IAAK,UACL,IAAK,WACHh3B,KAAK42B,wBAA0BI,EAMnC,GAAIA,EAEF,YADAh3B,KAAK62B,gBAIP,MAAMzpB,EAAclO,EAAMY,cACtBE,KAAK2D,WAAayJ,GAAepN,KAAK2D,SAAS3J,SAASoT,IAI5DpN,KAAK82B,qBAGP5F,gBACE5wB,EAAaQ,GAAGd,KAAK2D,SA/KA,qBA+K2BzE,GAASc,KAAK+2B,eAAe73B,GAAO,IACpFoB,EAAaQ,GAAGd,KAAK2D,SA/KD,oBA+K2BzE,GAASc,KAAK+2B,eAAe73B,GAAO,IACnFoB,EAAaQ,GAAGd,KAAK2D,SA/KF,mBA+K2BzE,GAASc,KAAK+2B,eAAe73B,GAAO,IAClFoB,EAAaQ,GAAGd,KAAK2D,SA/KD,oBA+K2BzE,GAASc,KAAK+2B,eAAe73B,GAAO,IAGrF23B,gBACE5qB,aAAajM,KAAK8wB,UAClB9wB,KAAK8wB,SAAW,KAKI3sB,uBAAC5L,GACrB,OAAOyH,KAAKiF,MAAK,WACf,MAAMC,EAAOwxB,GAAM7xB,oBAAoB7E,KAAMzH,GAE7C,GAAsB,iBAAXA,EAAqB,CAC9B,QAA4B,IAAjB2M,EAAK3M,GACd,MAAM,IAAIe,UAAW,oBAAmBf,MAG1C2M,EAAK3M,GAAQyH,kBAMrBuE,EAAqBmyB,IASrBt7B,EAAmBs7B,IC3NJ,CACb5xB,MAAAA,EACAM,OAAAA,EACAiE,SAAAA,EACA8E,SAAAA,GACAgY,SAAAA,GACAmE,MAAAA,GACA0B,UAAAA,GACAiI,QAAAA,GACAG,UAAAA,GACA0B,IAAAA,GACAY,MAAAA,GACA9F,QAAAA","sourcesContent":["/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/index.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nconst MAX_UID = 1000000\nconst MILLISECONDS_MULTIPLIER = 1000\nconst TRANSITION_END = 'transitionend'\n\n// Shoutout AngusCroll (https://goo.gl/pxwQGp)\nconst toType = obj => {\n if (obj === null || obj === undefined) {\n return `${obj}`\n }\n\n return {}.toString.call(obj).match(/\\s([a-z]+)/i)[1].toLowerCase()\n}\n\n/**\n * --------------------------------------------------------------------------\n * Public Util Api\n * --------------------------------------------------------------------------\n */\n\nconst getUID = prefix => {\n do {\n prefix += Math.floor(Math.random() * MAX_UID)\n } while (document.getElementById(prefix))\n\n return prefix\n}\n\nconst getSelector = element => {\n let selector = element.getAttribute('data-bs-target')\n\n if (!selector || selector === '#') {\n let hrefAttr = element.getAttribute('href')\n\n // The only valid content that could double as a selector are IDs or classes,\n // so everything starting with `#` or `.`. If a \"real\" URL is used as the selector,\n // `document.querySelector` will rightfully complain it is invalid.\n // See https://github.com/twbs/bootstrap/issues/32273\n if (!hrefAttr || (!hrefAttr.includes('#') && !hrefAttr.startsWith('.'))) {\n return null\n }\n\n // Just in case some CMS puts out a full URL with the anchor appended\n if (hrefAttr.includes('#') && !hrefAttr.startsWith('#')) {\n hrefAttr = `#${hrefAttr.split('#')[1]}`\n }\n\n selector = hrefAttr && hrefAttr !== '#' ? hrefAttr.trim() : null\n }\n\n return selector\n}\n\nconst getSelectorFromElement = element => {\n const selector = getSelector(element)\n\n if (selector) {\n return document.querySelector(selector) ? selector : null\n }\n\n return null\n}\n\nconst getElementFromSelector = element => {\n const selector = getSelector(element)\n\n return selector ? document.querySelector(selector) : null\n}\n\nconst getTransitionDurationFromElement = element => {\n if (!element) {\n return 0\n }\n\n // Get transition-duration of the element\n let { transitionDuration, transitionDelay } = window.getComputedStyle(element)\n\n const floatTransitionDuration = Number.parseFloat(transitionDuration)\n const floatTransitionDelay = Number.parseFloat(transitionDelay)\n\n // Return 0 if element or transition duration is not found\n if (!floatTransitionDuration && !floatTransitionDelay) {\n return 0\n }\n\n // If multiple durations are defined, take the first\n transitionDuration = transitionDuration.split(',')[0]\n transitionDelay = transitionDelay.split(',')[0]\n\n return (Number.parseFloat(transitionDuration) + Number.parseFloat(transitionDelay)) * MILLISECONDS_MULTIPLIER\n}\n\nconst triggerTransitionEnd = element => {\n element.dispatchEvent(new Event(TRANSITION_END))\n}\n\nconst isElement = obj => {\n if (!obj || typeof obj !== 'object') {\n return false\n }\n\n if (typeof obj.jquery !== 'undefined') {\n obj = obj[0]\n }\n\n return typeof obj.nodeType !== 'undefined'\n}\n\nconst getElement = obj => {\n if (isElement(obj)) { // it's a jQuery object or a node element\n return obj.jquery ? obj[0] : obj\n }\n\n if (typeof obj === 'string' && obj.length > 0) {\n return document.querySelector(obj)\n }\n\n return null\n}\n\nconst typeCheckConfig = (componentName, config, configTypes) => {\n Object.keys(configTypes).forEach(property => {\n const expectedTypes = configTypes[property]\n const value = config[property]\n const valueType = value && isElement(value) ? 'element' : toType(value)\n\n if (!new RegExp(expectedTypes).test(valueType)) {\n throw new TypeError(\n `${componentName.toUpperCase()}: Option \"${property}\" provided type \"${valueType}\" but expected type \"${expectedTypes}\".`\n )\n }\n })\n}\n\nconst isVisible = element => {\n if (!isElement(element) || element.getClientRects().length === 0) {\n return false\n }\n\n return getComputedStyle(element).getPropertyValue('visibility') === 'visible'\n}\n\nconst isDisabled = element => {\n if (!element || element.nodeType !== Node.ELEMENT_NODE) {\n return true\n }\n\n if (element.classList.contains('disabled')) {\n return true\n }\n\n if (typeof element.disabled !== 'undefined') {\n return element.disabled\n }\n\n return element.hasAttribute('disabled') && element.getAttribute('disabled') !== 'false'\n}\n\nconst findShadowRoot = element => {\n if (!document.documentElement.attachShadow) {\n return null\n }\n\n // Can find the shadow root otherwise it'll return the document\n if (typeof element.getRootNode === 'function') {\n const root = element.getRootNode()\n return root instanceof ShadowRoot ? root : null\n }\n\n if (element instanceof ShadowRoot) {\n return element\n }\n\n // when we don't find a shadow root\n if (!element.parentNode) {\n return null\n }\n\n return findShadowRoot(element.parentNode)\n}\n\nconst noop = () => {}\n\n/**\n * Trick to restart an element's animation\n *\n * @param {HTMLElement} element\n * @return void\n *\n * @see https://www.charistheo.io/blog/2021/02/restart-a-css-animation-with-javascript/#restarting-a-css-animation\n */\nconst reflow = element => {\n // eslint-disable-next-line no-unused-expressions\n element.offsetHeight\n}\n\nconst getjQuery = () => {\n const { jQuery } = window\n\n if (jQuery && !document.body.hasAttribute('data-bs-no-jquery')) {\n return jQuery\n }\n\n return null\n}\n\nconst DOMContentLoadedCallbacks = []\n\nconst onDOMContentLoaded = callback => {\n if (document.readyState === 'loading') {\n // add listener on the first call when the document is in loading state\n if (!DOMContentLoadedCallbacks.length) {\n document.addEventListener('DOMContentLoaded', () => {\n DOMContentLoadedCallbacks.forEach(callback => callback())\n })\n }\n\n DOMContentLoadedCallbacks.push(callback)\n } else {\n callback()\n }\n}\n\nconst isRTL = () => document.documentElement.dir === 'rtl'\n\nconst defineJQueryPlugin = plugin => {\n onDOMContentLoaded(() => {\n const $ = getjQuery()\n /* istanbul ignore if */\n if ($) {\n const name = plugin.NAME\n const JQUERY_NO_CONFLICT = $.fn[name]\n $.fn[name] = plugin.jQueryInterface\n $.fn[name].Constructor = plugin\n $.fn[name].noConflict = () => {\n $.fn[name] = JQUERY_NO_CONFLICT\n return plugin.jQueryInterface\n }\n }\n })\n}\n\nconst execute = callback => {\n if (typeof callback === 'function') {\n callback()\n }\n}\n\nconst executeAfterTransition = (callback, transitionElement, waitForTransition = true) => {\n if (!waitForTransition) {\n execute(callback)\n return\n }\n\n const durationPadding = 5\n const emulatedDuration = getTransitionDurationFromElement(transitionElement) + durationPadding\n\n let called = false\n\n const handler = ({ target }) => {\n if (target !== transitionElement) {\n return\n }\n\n called = true\n transitionElement.removeEventListener(TRANSITION_END, handler)\n execute(callback)\n }\n\n transitionElement.addEventListener(TRANSITION_END, handler)\n setTimeout(() => {\n if (!called) {\n triggerTransitionEnd(transitionElement)\n }\n }, emulatedDuration)\n}\n\n/**\n * Return the previous/next element of a list.\n *\n * @param {array} list The list of elements\n * @param activeElement The active element\n * @param shouldGetNext Choose to get next or previous element\n * @param isCycleAllowed\n * @return {Element|elem} The proper element\n */\nconst getNextActiveElement = (list, activeElement, shouldGetNext, isCycleAllowed) => {\n let index = list.indexOf(activeElement)\n\n // if the element does not exist in the list return an element depending on the direction and if cycle is allowed\n if (index === -1) {\n return list[!shouldGetNext && isCycleAllowed ? list.length - 1 : 0]\n }\n\n const listLength = list.length\n\n index += shouldGetNext ? 1 : -1\n\n if (isCycleAllowed) {\n index = (index + listLength) % listLength\n }\n\n return list[Math.max(0, Math.min(index, listLength - 1))]\n}\n\nexport {\n getElement,\n getUID,\n getSelectorFromElement,\n getElementFromSelector,\n getTransitionDurationFromElement,\n triggerTransitionEnd,\n isElement,\n typeCheckConfig,\n isVisible,\n isDisabled,\n findShadowRoot,\n noop,\n getNextActiveElement,\n reflow,\n getjQuery,\n onDOMContentLoaded,\n isRTL,\n defineJQueryPlugin,\n execute,\n executeAfterTransition\n}\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): dom/event-handler.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport { getjQuery } from '../util/index'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst namespaceRegex = /[^.]*(?=\\..*)\\.|.*/\nconst stripNameRegex = /\\..*/\nconst stripUidRegex = /::\\d+$/\nconst eventRegistry = {} // Events storage\nlet uidEvent = 1\nconst customEvents = {\n mouseenter: 'mouseover',\n mouseleave: 'mouseout'\n}\nconst customEventsRegex = /^(mouseenter|mouseleave)/i\nconst nativeEvents = new Set([\n 'click',\n 'dblclick',\n 'mouseup',\n 'mousedown',\n 'contextmenu',\n 'mousewheel',\n 'DOMMouseScroll',\n 'mouseover',\n 'mouseout',\n 'mousemove',\n 'selectstart',\n 'selectend',\n 'keydown',\n 'keypress',\n 'keyup',\n 'orientationchange',\n 'touchstart',\n 'touchmove',\n 'touchend',\n 'touchcancel',\n 'pointerdown',\n 'pointermove',\n 'pointerup',\n 'pointerleave',\n 'pointercancel',\n 'gesturestart',\n 'gesturechange',\n 'gestureend',\n 'focus',\n 'blur',\n 'change',\n 'reset',\n 'select',\n 'submit',\n 'focusin',\n 'focusout',\n 'load',\n 'unload',\n 'beforeunload',\n 'resize',\n 'move',\n 'DOMContentLoaded',\n 'readystatechange',\n 'error',\n 'abort',\n 'scroll'\n])\n\n/**\n * ------------------------------------------------------------------------\n * Private methods\n * ------------------------------------------------------------------------\n */\n\nfunction getUidEvent(element, uid) {\n return (uid && `${uid}::${uidEvent++}`) || element.uidEvent || uidEvent++\n}\n\nfunction getEvent(element) {\n const uid = getUidEvent(element)\n\n element.uidEvent = uid\n eventRegistry[uid] = eventRegistry[uid] || {}\n\n return eventRegistry[uid]\n}\n\nfunction bootstrapHandler(element, fn) {\n return function handler(event) {\n event.delegateTarget = element\n\n if (handler.oneOff) {\n EventHandler.off(element, event.type, fn)\n }\n\n return fn.apply(element, [event])\n }\n}\n\nfunction bootstrapDelegationHandler(element, selector, fn) {\n return function handler(event) {\n const domElements = element.querySelectorAll(selector)\n\n for (let { target } = event; target && target !== this; target = target.parentNode) {\n for (let i = domElements.length; i--;) {\n if (domElements[i] === target) {\n event.delegateTarget = target\n\n if (handler.oneOff) {\n // eslint-disable-next-line unicorn/consistent-destructuring\n EventHandler.off(element, event.type, selector, fn)\n }\n\n return fn.apply(target, [event])\n }\n }\n }\n\n // To please ESLint\n return null\n }\n}\n\nfunction findHandler(events, handler, delegationSelector = null) {\n const uidEventList = Object.keys(events)\n\n for (let i = 0, len = uidEventList.length; i < len; i++) {\n const event = events[uidEventList[i]]\n\n if (event.originalHandler === handler && event.delegationSelector === delegationSelector) {\n return event\n }\n }\n\n return null\n}\n\nfunction normalizeParams(originalTypeEvent, handler, delegationFn) {\n const delegation = typeof handler === 'string'\n const originalHandler = delegation ? delegationFn : handler\n\n let typeEvent = getTypeEvent(originalTypeEvent)\n const isNative = nativeEvents.has(typeEvent)\n\n if (!isNative) {\n typeEvent = originalTypeEvent\n }\n\n return [delegation, originalHandler, typeEvent]\n}\n\nfunction addHandler(element, originalTypeEvent, handler, delegationFn, oneOff) {\n if (typeof originalTypeEvent !== 'string' || !element) {\n return\n }\n\n if (!handler) {\n handler = delegationFn\n delegationFn = null\n }\n\n // in case of mouseenter or mouseleave wrap the handler within a function that checks for its DOM position\n // this prevents the handler from being dispatched the same way as mouseover or mouseout does\n if (customEventsRegex.test(originalTypeEvent)) {\n const wrapFn = fn => {\n return function (event) {\n if (!event.relatedTarget || (event.relatedTarget !== event.delegateTarget && !event.delegateTarget.contains(event.relatedTarget))) {\n return fn.call(this, event)\n }\n }\n }\n\n if (delegationFn) {\n delegationFn = wrapFn(delegationFn)\n } else {\n handler = wrapFn(handler)\n }\n }\n\n const [delegation, originalHandler, typeEvent] = normalizeParams(originalTypeEvent, handler, delegationFn)\n const events = getEvent(element)\n const handlers = events[typeEvent] || (events[typeEvent] = {})\n const previousFn = findHandler(handlers, originalHandler, delegation ? handler : null)\n\n if (previousFn) {\n previousFn.oneOff = previousFn.oneOff && oneOff\n\n return\n }\n\n const uid = getUidEvent(originalHandler, originalTypeEvent.replace(namespaceRegex, ''))\n const fn = delegation ?\n bootstrapDelegationHandler(element, handler, delegationFn) :\n bootstrapHandler(element, handler)\n\n fn.delegationSelector = delegation ? handler : null\n fn.originalHandler = originalHandler\n fn.oneOff = oneOff\n fn.uidEvent = uid\n handlers[uid] = fn\n\n element.addEventListener(typeEvent, fn, delegation)\n}\n\nfunction removeHandler(element, events, typeEvent, handler, delegationSelector) {\n const fn = findHandler(events[typeEvent], handler, delegationSelector)\n\n if (!fn) {\n return\n }\n\n element.removeEventListener(typeEvent, fn, Boolean(delegationSelector))\n delete events[typeEvent][fn.uidEvent]\n}\n\nfunction removeNamespacedHandlers(element, events, typeEvent, namespace) {\n const storeElementEvent = events[typeEvent] || {}\n\n Object.keys(storeElementEvent).forEach(handlerKey => {\n if (handlerKey.includes(namespace)) {\n const event = storeElementEvent[handlerKey]\n\n removeHandler(element, events, typeEvent, event.originalHandler, event.delegationSelector)\n }\n })\n}\n\nfunction getTypeEvent(event) {\n // allow to get the native events from namespaced events ('click.bs.button' --> 'click')\n event = event.replace(stripNameRegex, '')\n return customEvents[event] || event\n}\n\nconst EventHandler = {\n on(element, event, handler, delegationFn) {\n addHandler(element, event, handler, delegationFn, false)\n },\n\n one(element, event, handler, delegationFn) {\n addHandler(element, event, handler, delegationFn, true)\n },\n\n off(element, originalTypeEvent, handler, delegationFn) {\n if (typeof originalTypeEvent !== 'string' || !element) {\n return\n }\n\n const [delegation, originalHandler, typeEvent] = normalizeParams(originalTypeEvent, handler, delegationFn)\n const inNamespace = typeEvent !== originalTypeEvent\n const events = getEvent(element)\n const isNamespace = originalTypeEvent.startsWith('.')\n\n if (typeof originalHandler !== 'undefined') {\n // Simplest case: handler is passed, remove that listener ONLY.\n if (!events || !events[typeEvent]) {\n return\n }\n\n removeHandler(element, events, typeEvent, originalHandler, delegation ? handler : null)\n return\n }\n\n if (isNamespace) {\n Object.keys(events).forEach(elementEvent => {\n removeNamespacedHandlers(element, events, elementEvent, originalTypeEvent.slice(1))\n })\n }\n\n const storeElementEvent = events[typeEvent] || {}\n Object.keys(storeElementEvent).forEach(keyHandlers => {\n const handlerKey = keyHandlers.replace(stripUidRegex, '')\n\n if (!inNamespace || originalTypeEvent.includes(handlerKey)) {\n const event = storeElementEvent[keyHandlers]\n\n removeHandler(element, events, typeEvent, event.originalHandler, event.delegationSelector)\n }\n })\n },\n\n trigger(element, event, args) {\n if (typeof event !== 'string' || !element) {\n return null\n }\n\n const $ = getjQuery()\n const typeEvent = getTypeEvent(event)\n const inNamespace = event !== typeEvent\n const isNative = nativeEvents.has(typeEvent)\n\n let jQueryEvent\n let bubbles = true\n let nativeDispatch = true\n let defaultPrevented = false\n let evt = null\n\n if (inNamespace && $) {\n jQueryEvent = $.Event(event, args)\n\n $(element).trigger(jQueryEvent)\n bubbles = !jQueryEvent.isPropagationStopped()\n nativeDispatch = !jQueryEvent.isImmediatePropagationStopped()\n defaultPrevented = jQueryEvent.isDefaultPrevented()\n }\n\n if (isNative) {\n evt = document.createEvent('HTMLEvents')\n evt.initEvent(typeEvent, bubbles, true)\n } else {\n evt = new CustomEvent(event, {\n bubbles,\n cancelable: true\n })\n }\n\n // merge custom information in our event\n if (typeof args !== 'undefined') {\n Object.keys(args).forEach(key => {\n Object.defineProperty(evt, key, {\n get() {\n return args[key]\n }\n })\n })\n }\n\n if (defaultPrevented) {\n evt.preventDefault()\n }\n\n if (nativeDispatch) {\n element.dispatchEvent(evt)\n }\n\n if (evt.defaultPrevented && typeof jQueryEvent !== 'undefined') {\n jQueryEvent.preventDefault()\n }\n\n return evt\n }\n}\n\nexport default EventHandler\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): dom/data.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst elementMap = new Map()\n\nexport default {\n set(element, key, instance) {\n if (!elementMap.has(element)) {\n elementMap.set(element, new Map())\n }\n\n const instanceMap = elementMap.get(element)\n\n // make it clear we only want one instance per element\n // can be removed later when multiple key/instances are fine to be used\n if (!instanceMap.has(key) && instanceMap.size !== 0) {\n // eslint-disable-next-line no-console\n console.error(`Bootstrap doesn't allow more than one instance per element. Bound instance: ${Array.from(instanceMap.keys())[0]}.`)\n return\n }\n\n instanceMap.set(key, instance)\n },\n\n get(element, key) {\n if (elementMap.has(element)) {\n return elementMap.get(element).get(key) || null\n }\n\n return null\n },\n\n remove(element, key) {\n if (!elementMap.has(element)) {\n return\n }\n\n const instanceMap = elementMap.get(element)\n\n instanceMap.delete(key)\n\n // free up element references if there are no instances left for an element\n if (instanceMap.size === 0) {\n elementMap.delete(element)\n }\n }\n}\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): base-component.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport Data from './dom/data'\nimport {\n executeAfterTransition,\n getElement\n} from './util/index'\nimport EventHandler from './dom/event-handler'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst VERSION = '5.1.0'\n\nclass BaseComponent {\n constructor(element) {\n element = getElement(element)\n\n if (!element) {\n return\n }\n\n this._element = element\n Data.set(this._element, this.constructor.DATA_KEY, this)\n }\n\n dispose() {\n Data.remove(this._element, this.constructor.DATA_KEY)\n EventHandler.off(this._element, this.constructor.EVENT_KEY)\n\n Object.getOwnPropertyNames(this).forEach(propertyName => {\n this[propertyName] = null\n })\n }\n\n _queueCallback(callback, element, isAnimated = true) {\n executeAfterTransition(callback, element, isAnimated)\n }\n\n /** Static */\n\n static getInstance(element) {\n return Data.get(getElement(element), this.DATA_KEY)\n }\n\n static getOrCreateInstance(element, config = {}) {\n return this.getInstance(element) || new this(element, typeof config === 'object' ? config : null)\n }\n\n static get VERSION() {\n return VERSION\n }\n\n static get NAME() {\n throw new Error('You have to implement the static method \"NAME\", for each component!')\n }\n\n static get DATA_KEY() {\n return `bs.${this.NAME}`\n }\n\n static get EVENT_KEY() {\n return `.${this.DATA_KEY}`\n }\n}\n\nexport default BaseComponent\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/component-functions.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport EventHandler from '../dom/event-handler'\nimport { getElementFromSelector, isDisabled } from './index'\n\nconst enableDismissTrigger = (component, method = 'hide') => {\n const clickEvent = `click.dismiss${component.EVENT_KEY}`\n const name = component.NAME\n\n EventHandler.on(document, clickEvent, `[data-bs-dismiss=\"${name}\"]`, function (event) {\n if (['A', 'AREA'].includes(this.tagName)) {\n event.preventDefault()\n }\n\n if (isDisabled(this)) {\n return\n }\n\n const target = getElementFromSelector(this) || this.closest(`.${name}`)\n const instance = component.getOrCreateInstance(target)\n\n // Method argument is left, for Alert and only, as it doesn't implement the 'hide' method\n instance[method]()\n })\n}\n\nexport {\n enableDismissTrigger\n}\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): alert.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport { defineJQueryPlugin } from './util/index'\nimport EventHandler from './dom/event-handler'\nimport BaseComponent from './base-component'\nimport { enableDismissTrigger } from './util/component-functions'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'alert'\nconst DATA_KEY = 'bs.alert'\nconst EVENT_KEY = `.${DATA_KEY}`\n\nconst EVENT_CLOSE = `close${EVENT_KEY}`\nconst EVENT_CLOSED = `closed${EVENT_KEY}`\nconst CLASS_NAME_FADE = 'fade'\nconst CLASS_NAME_SHOW = 'show'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Alert extends BaseComponent {\n // Getters\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n close() {\n const closeEvent = EventHandler.trigger(this._element, EVENT_CLOSE)\n\n if (closeEvent.defaultPrevented) {\n return\n }\n\n this._element.classList.remove(CLASS_NAME_SHOW)\n\n const isAnimated = this._element.classList.contains(CLASS_NAME_FADE)\n this._queueCallback(() => this._destroyElement(), this._element, isAnimated)\n }\n\n // Private\n _destroyElement() {\n this._element.remove()\n EventHandler.trigger(this._element, EVENT_CLOSED)\n this.dispose()\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Alert.getOrCreateInstance(this)\n\n if (typeof config !== 'string') {\n return\n }\n\n if (data[config] === undefined || config.startsWith('_') || config === 'constructor') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config](this)\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nenableDismissTrigger(Alert, 'close')\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Alert to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Alert)\n\nexport default Alert\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): button.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport { defineJQueryPlugin } from './util/index'\nimport EventHandler from './dom/event-handler'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'button'\nconst DATA_KEY = 'bs.button'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\n\nconst CLASS_NAME_ACTIVE = 'active'\n\nconst SELECTOR_DATA_TOGGLE = '[data-bs-toggle=\"button\"]'\n\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Button extends BaseComponent {\n // Getters\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n toggle() {\n // Toggle class and sync the `aria-pressed` attribute with the return value of the `.toggle()` method\n this._element.setAttribute('aria-pressed', this._element.classList.toggle(CLASS_NAME_ACTIVE))\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Button.getOrCreateInstance(this)\n\n if (config === 'toggle') {\n data[config]()\n }\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_TOGGLE, event => {\n event.preventDefault()\n\n const button = event.target.closest(SELECTOR_DATA_TOGGLE)\n const data = Button.getOrCreateInstance(button)\n\n data.toggle()\n})\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Button to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Button)\n\nexport default Button\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): dom/manipulator.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nfunction normalizeData(val) {\n if (val === 'true') {\n return true\n }\n\n if (val === 'false') {\n return false\n }\n\n if (val === Number(val).toString()) {\n return Number(val)\n }\n\n if (val === '' || val === 'null') {\n return null\n }\n\n return val\n}\n\nfunction normalizeDataKey(key) {\n return key.replace(/[A-Z]/g, chr => `-${chr.toLowerCase()}`)\n}\n\nconst Manipulator = {\n setDataAttribute(element, key, value) {\n element.setAttribute(`data-bs-${normalizeDataKey(key)}`, value)\n },\n\n removeDataAttribute(element, key) {\n element.removeAttribute(`data-bs-${normalizeDataKey(key)}`)\n },\n\n getDataAttributes(element) {\n if (!element) {\n return {}\n }\n\n const attributes = {}\n\n Object.keys(element.dataset)\n .filter(key => key.startsWith('bs'))\n .forEach(key => {\n let pureKey = key.replace(/^bs/, '')\n pureKey = pureKey.charAt(0).toLowerCase() + pureKey.slice(1, pureKey.length)\n attributes[pureKey] = normalizeData(element.dataset[key])\n })\n\n return attributes\n },\n\n getDataAttribute(element, key) {\n return normalizeData(element.getAttribute(`data-bs-${normalizeDataKey(key)}`))\n },\n\n offset(element) {\n const rect = element.getBoundingClientRect()\n\n return {\n top: rect.top + window.pageYOffset,\n left: rect.left + window.pageXOffset\n }\n },\n\n position(element) {\n return {\n top: element.offsetTop,\n left: element.offsetLeft\n }\n }\n}\n\nexport default Manipulator\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): dom/selector-engine.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nimport { isDisabled, isVisible } from '../util/index'\n\nconst NODE_TEXT = 3\n\nconst SelectorEngine = {\n find(selector, element = document.documentElement) {\n return [].concat(...Element.prototype.querySelectorAll.call(element, selector))\n },\n\n findOne(selector, element = document.documentElement) {\n return Element.prototype.querySelector.call(element, selector)\n },\n\n children(element, selector) {\n return [].concat(...element.children)\n .filter(child => child.matches(selector))\n },\n\n parents(element, selector) {\n const parents = []\n\n let ancestor = element.parentNode\n\n while (ancestor && ancestor.nodeType === Node.ELEMENT_NODE && ancestor.nodeType !== NODE_TEXT) {\n if (ancestor.matches(selector)) {\n parents.push(ancestor)\n }\n\n ancestor = ancestor.parentNode\n }\n\n return parents\n },\n\n prev(element, selector) {\n let previous = element.previousElementSibling\n\n while (previous) {\n if (previous.matches(selector)) {\n return [previous]\n }\n\n previous = previous.previousElementSibling\n }\n\n return []\n },\n\n next(element, selector) {\n let next = element.nextElementSibling\n\n while (next) {\n if (next.matches(selector)) {\n return [next]\n }\n\n next = next.nextElementSibling\n }\n\n return []\n },\n\n focusableChildren(element) {\n const focusables = [\n 'a',\n 'button',\n 'input',\n 'textarea',\n 'select',\n 'details',\n '[tabindex]',\n '[contenteditable=\"true\"]'\n ].map(selector => `${selector}:not([tabindex^=\"-\"])`).join(', ')\n\n return this.find(focusables, element).filter(el => !isDisabled(el) && isVisible(el))\n }\n}\n\nexport default SelectorEngine\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): carousel.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport {\n defineJQueryPlugin,\n getElementFromSelector,\n isRTL,\n isVisible,\n getNextActiveElement,\n reflow,\n triggerTransitionEnd,\n typeCheckConfig\n} from './util/index'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'carousel'\nconst DATA_KEY = 'bs.carousel'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\n\nconst ARROW_LEFT_KEY = 'ArrowLeft'\nconst ARROW_RIGHT_KEY = 'ArrowRight'\nconst TOUCHEVENT_COMPAT_WAIT = 500 // Time for mouse compat events to fire after touch\nconst SWIPE_THRESHOLD = 40\n\nconst Default = {\n interval: 5000,\n keyboard: true,\n slide: false,\n pause: 'hover',\n wrap: true,\n touch: true\n}\n\nconst DefaultType = {\n interval: '(number|boolean)',\n keyboard: 'boolean',\n slide: '(boolean|string)',\n pause: '(string|boolean)',\n wrap: 'boolean',\n touch: 'boolean'\n}\n\nconst ORDER_NEXT = 'next'\nconst ORDER_PREV = 'prev'\nconst DIRECTION_LEFT = 'left'\nconst DIRECTION_RIGHT = 'right'\n\nconst KEY_TO_DIRECTION = {\n [ARROW_LEFT_KEY]: DIRECTION_RIGHT,\n [ARROW_RIGHT_KEY]: DIRECTION_LEFT\n}\n\nconst EVENT_SLIDE = `slide${EVENT_KEY}`\nconst EVENT_SLID = `slid${EVENT_KEY}`\nconst EVENT_KEYDOWN = `keydown${EVENT_KEY}`\nconst EVENT_MOUSEENTER = `mouseenter${EVENT_KEY}`\nconst EVENT_MOUSELEAVE = `mouseleave${EVENT_KEY}`\nconst EVENT_TOUCHSTART = `touchstart${EVENT_KEY}`\nconst EVENT_TOUCHMOVE = `touchmove${EVENT_KEY}`\nconst EVENT_TOUCHEND = `touchend${EVENT_KEY}`\nconst EVENT_POINTERDOWN = `pointerdown${EVENT_KEY}`\nconst EVENT_POINTERUP = `pointerup${EVENT_KEY}`\nconst EVENT_DRAG_START = `dragstart${EVENT_KEY}`\nconst EVENT_LOAD_DATA_API = `load${EVENT_KEY}${DATA_API_KEY}`\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\n\nconst CLASS_NAME_CAROUSEL = 'carousel'\nconst CLASS_NAME_ACTIVE = 'active'\nconst CLASS_NAME_SLIDE = 'slide'\nconst CLASS_NAME_END = 'carousel-item-end'\nconst CLASS_NAME_START = 'carousel-item-start'\nconst CLASS_NAME_NEXT = 'carousel-item-next'\nconst CLASS_NAME_PREV = 'carousel-item-prev'\nconst CLASS_NAME_POINTER_EVENT = 'pointer-event'\n\nconst SELECTOR_ACTIVE = '.active'\nconst SELECTOR_ACTIVE_ITEM = '.active.carousel-item'\nconst SELECTOR_ITEM = '.carousel-item'\nconst SELECTOR_ITEM_IMG = '.carousel-item img'\nconst SELECTOR_NEXT_PREV = '.carousel-item-next, .carousel-item-prev'\nconst SELECTOR_INDICATORS = '.carousel-indicators'\nconst SELECTOR_INDICATOR = '[data-bs-target]'\nconst SELECTOR_DATA_SLIDE = '[data-bs-slide], [data-bs-slide-to]'\nconst SELECTOR_DATA_RIDE = '[data-bs-ride=\"carousel\"]'\n\nconst POINTER_TYPE_TOUCH = 'touch'\nconst POINTER_TYPE_PEN = 'pen'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\nclass Carousel extends BaseComponent {\n constructor(element, config) {\n super(element)\n\n this._items = null\n this._interval = null\n this._activeElement = null\n this._isPaused = false\n this._isSliding = false\n this.touchTimeout = null\n this.touchStartX = 0\n this.touchDeltaX = 0\n\n this._config = this._getConfig(config)\n this._indicatorsElement = SelectorEngine.findOne(SELECTOR_INDICATORS, this._element)\n this._touchSupported = 'ontouchstart' in document.documentElement || navigator.maxTouchPoints > 0\n this._pointerEvent = Boolean(window.PointerEvent)\n\n this._addEventListeners()\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n next() {\n this._slide(ORDER_NEXT)\n }\n\n nextWhenVisible() {\n // Don't call next when the page isn't visible\n // or the carousel or its parent isn't visible\n if (!document.hidden && isVisible(this._element)) {\n this.next()\n }\n }\n\n prev() {\n this._slide(ORDER_PREV)\n }\n\n pause(event) {\n if (!event) {\n this._isPaused = true\n }\n\n if (SelectorEngine.findOne(SELECTOR_NEXT_PREV, this._element)) {\n triggerTransitionEnd(this._element)\n this.cycle(true)\n }\n\n clearInterval(this._interval)\n this._interval = null\n }\n\n cycle(event) {\n if (!event) {\n this._isPaused = false\n }\n\n if (this._interval) {\n clearInterval(this._interval)\n this._interval = null\n }\n\n if (this._config && this._config.interval && !this._isPaused) {\n this._updateInterval()\n\n this._interval = setInterval(\n (document.visibilityState ? this.nextWhenVisible : this.next).bind(this),\n this._config.interval\n )\n }\n }\n\n to(index) {\n this._activeElement = SelectorEngine.findOne(SELECTOR_ACTIVE_ITEM, this._element)\n const activeIndex = this._getItemIndex(this._activeElement)\n\n if (index > this._items.length - 1 || index < 0) {\n return\n }\n\n if (this._isSliding) {\n EventHandler.one(this._element, EVENT_SLID, () => this.to(index))\n return\n }\n\n if (activeIndex === index) {\n this.pause()\n this.cycle()\n return\n }\n\n const order = index > activeIndex ?\n ORDER_NEXT :\n ORDER_PREV\n\n this._slide(order, this._items[index])\n }\n\n // Private\n\n _getConfig(config) {\n config = {\n ...Default,\n ...Manipulator.getDataAttributes(this._element),\n ...(typeof config === 'object' ? config : {})\n }\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n\n _handleSwipe() {\n const absDeltax = Math.abs(this.touchDeltaX)\n\n if (absDeltax <= SWIPE_THRESHOLD) {\n return\n }\n\n const direction = absDeltax / this.touchDeltaX\n\n this.touchDeltaX = 0\n\n if (!direction) {\n return\n }\n\n this._slide(direction > 0 ? DIRECTION_RIGHT : DIRECTION_LEFT)\n }\n\n _addEventListeners() {\n if (this._config.keyboard) {\n EventHandler.on(this._element, EVENT_KEYDOWN, event => this._keydown(event))\n }\n\n if (this._config.pause === 'hover') {\n EventHandler.on(this._element, EVENT_MOUSEENTER, event => this.pause(event))\n EventHandler.on(this._element, EVENT_MOUSELEAVE, event => this.cycle(event))\n }\n\n if (this._config.touch && this._touchSupported) {\n this._addTouchEventListeners()\n }\n }\n\n _addTouchEventListeners() {\n const start = event => {\n if (this._pointerEvent && (event.pointerType === POINTER_TYPE_PEN || event.pointerType === POINTER_TYPE_TOUCH)) {\n this.touchStartX = event.clientX\n } else if (!this._pointerEvent) {\n this.touchStartX = event.touches[0].clientX\n }\n }\n\n const move = event => {\n // ensure swiping with one touch and not pinching\n this.touchDeltaX = event.touches && event.touches.length > 1 ?\n 0 :\n event.touches[0].clientX - this.touchStartX\n }\n\n const end = event => {\n if (this._pointerEvent && (event.pointerType === POINTER_TYPE_PEN || event.pointerType === POINTER_TYPE_TOUCH)) {\n this.touchDeltaX = event.clientX - this.touchStartX\n }\n\n this._handleSwipe()\n if (this._config.pause === 'hover') {\n // If it's a touch-enabled device, mouseenter/leave are fired as\n // part of the mouse compatibility events on first tap - the carousel\n // would stop cycling until user tapped out of it;\n // here, we listen for touchend, explicitly pause the carousel\n // (as if it's the second time we tap on it, mouseenter compat event\n // is NOT fired) and after a timeout (to allow for mouse compatibility\n // events to fire) we explicitly restart cycling\n\n this.pause()\n if (this.touchTimeout) {\n clearTimeout(this.touchTimeout)\n }\n\n this.touchTimeout = setTimeout(event => this.cycle(event), TOUCHEVENT_COMPAT_WAIT + this._config.interval)\n }\n }\n\n SelectorEngine.find(SELECTOR_ITEM_IMG, this._element).forEach(itemImg => {\n EventHandler.on(itemImg, EVENT_DRAG_START, e => e.preventDefault())\n })\n\n if (this._pointerEvent) {\n EventHandler.on(this._element, EVENT_POINTERDOWN, event => start(event))\n EventHandler.on(this._element, EVENT_POINTERUP, event => end(event))\n\n this._element.classList.add(CLASS_NAME_POINTER_EVENT)\n } else {\n EventHandler.on(this._element, EVENT_TOUCHSTART, event => start(event))\n EventHandler.on(this._element, EVENT_TOUCHMOVE, event => move(event))\n EventHandler.on(this._element, EVENT_TOUCHEND, event => end(event))\n }\n }\n\n _keydown(event) {\n if (/input|textarea/i.test(event.target.tagName)) {\n return\n }\n\n const direction = KEY_TO_DIRECTION[event.key]\n if (direction) {\n event.preventDefault()\n this._slide(direction)\n }\n }\n\n _getItemIndex(element) {\n this._items = element && element.parentNode ?\n SelectorEngine.find(SELECTOR_ITEM, element.parentNode) :\n []\n\n return this._items.indexOf(element)\n }\n\n _getItemByOrder(order, activeElement) {\n const isNext = order === ORDER_NEXT\n return getNextActiveElement(this._items, activeElement, isNext, this._config.wrap)\n }\n\n _triggerSlideEvent(relatedTarget, eventDirectionName) {\n const targetIndex = this._getItemIndex(relatedTarget)\n const fromIndex = this._getItemIndex(SelectorEngine.findOne(SELECTOR_ACTIVE_ITEM, this._element))\n\n return EventHandler.trigger(this._element, EVENT_SLIDE, {\n relatedTarget,\n direction: eventDirectionName,\n from: fromIndex,\n to: targetIndex\n })\n }\n\n _setActiveIndicatorElement(element) {\n if (this._indicatorsElement) {\n const activeIndicator = SelectorEngine.findOne(SELECTOR_ACTIVE, this._indicatorsElement)\n\n activeIndicator.classList.remove(CLASS_NAME_ACTIVE)\n activeIndicator.removeAttribute('aria-current')\n\n const indicators = SelectorEngine.find(SELECTOR_INDICATOR, this._indicatorsElement)\n\n for (let i = 0; i < indicators.length; i++) {\n if (Number.parseInt(indicators[i].getAttribute('data-bs-slide-to'), 10) === this._getItemIndex(element)) {\n indicators[i].classList.add(CLASS_NAME_ACTIVE)\n indicators[i].setAttribute('aria-current', 'true')\n break\n }\n }\n }\n }\n\n _updateInterval() {\n const element = this._activeElement || SelectorEngine.findOne(SELECTOR_ACTIVE_ITEM, this._element)\n\n if (!element) {\n return\n }\n\n const elementInterval = Number.parseInt(element.getAttribute('data-bs-interval'), 10)\n\n if (elementInterval) {\n this._config.defaultInterval = this._config.defaultInterval || this._config.interval\n this._config.interval = elementInterval\n } else {\n this._config.interval = this._config.defaultInterval || this._config.interval\n }\n }\n\n _slide(directionOrOrder, element) {\n const order = this._directionToOrder(directionOrOrder)\n const activeElement = SelectorEngine.findOne(SELECTOR_ACTIVE_ITEM, this._element)\n const activeElementIndex = this._getItemIndex(activeElement)\n const nextElement = element || this._getItemByOrder(order, activeElement)\n\n const nextElementIndex = this._getItemIndex(nextElement)\n const isCycling = Boolean(this._interval)\n\n const isNext = order === ORDER_NEXT\n const directionalClassName = isNext ? CLASS_NAME_START : CLASS_NAME_END\n const orderClassName = isNext ? CLASS_NAME_NEXT : CLASS_NAME_PREV\n const eventDirectionName = this._orderToDirection(order)\n\n if (nextElement && nextElement.classList.contains(CLASS_NAME_ACTIVE)) {\n this._isSliding = false\n return\n }\n\n if (this._isSliding) {\n return\n }\n\n const slideEvent = this._triggerSlideEvent(nextElement, eventDirectionName)\n if (slideEvent.defaultPrevented) {\n return\n }\n\n if (!activeElement || !nextElement) {\n // Some weirdness is happening, so we bail\n return\n }\n\n this._isSliding = true\n\n if (isCycling) {\n this.pause()\n }\n\n this._setActiveIndicatorElement(nextElement)\n this._activeElement = nextElement\n\n const triggerSlidEvent = () => {\n EventHandler.trigger(this._element, EVENT_SLID, {\n relatedTarget: nextElement,\n direction: eventDirectionName,\n from: activeElementIndex,\n to: nextElementIndex\n })\n }\n\n if (this._element.classList.contains(CLASS_NAME_SLIDE)) {\n nextElement.classList.add(orderClassName)\n\n reflow(nextElement)\n\n activeElement.classList.add(directionalClassName)\n nextElement.classList.add(directionalClassName)\n\n const completeCallBack = () => {\n nextElement.classList.remove(directionalClassName, orderClassName)\n nextElement.classList.add(CLASS_NAME_ACTIVE)\n\n activeElement.classList.remove(CLASS_NAME_ACTIVE, orderClassName, directionalClassName)\n\n this._isSliding = false\n\n setTimeout(triggerSlidEvent, 0)\n }\n\n this._queueCallback(completeCallBack, activeElement, true)\n } else {\n activeElement.classList.remove(CLASS_NAME_ACTIVE)\n nextElement.classList.add(CLASS_NAME_ACTIVE)\n\n this._isSliding = false\n triggerSlidEvent()\n }\n\n if (isCycling) {\n this.cycle()\n }\n }\n\n _directionToOrder(direction) {\n if (![DIRECTION_RIGHT, DIRECTION_LEFT].includes(direction)) {\n return direction\n }\n\n if (isRTL()) {\n return direction === DIRECTION_LEFT ? ORDER_PREV : ORDER_NEXT\n }\n\n return direction === DIRECTION_LEFT ? ORDER_NEXT : ORDER_PREV\n }\n\n _orderToDirection(order) {\n if (![ORDER_NEXT, ORDER_PREV].includes(order)) {\n return order\n }\n\n if (isRTL()) {\n return order === ORDER_PREV ? DIRECTION_LEFT : DIRECTION_RIGHT\n }\n\n return order === ORDER_PREV ? DIRECTION_RIGHT : DIRECTION_LEFT\n }\n\n // Static\n\n static carouselInterface(element, config) {\n const data = Carousel.getOrCreateInstance(element, config)\n\n let { _config } = data\n if (typeof config === 'object') {\n _config = {\n ..._config,\n ...config\n }\n }\n\n const action = typeof config === 'string' ? config : _config.slide\n\n if (typeof config === 'number') {\n data.to(config)\n } else if (typeof action === 'string') {\n if (typeof data[action] === 'undefined') {\n throw new TypeError(`No method named \"${action}\"`)\n }\n\n data[action]()\n } else if (_config.interval && _config.ride) {\n data.pause()\n data.cycle()\n }\n }\n\n static jQueryInterface(config) {\n return this.each(function () {\n Carousel.carouselInterface(this, config)\n })\n }\n\n static dataApiClickHandler(event) {\n const target = getElementFromSelector(this)\n\n if (!target || !target.classList.contains(CLASS_NAME_CAROUSEL)) {\n return\n }\n\n const config = {\n ...Manipulator.getDataAttributes(target),\n ...Manipulator.getDataAttributes(this)\n }\n const slideIndex = this.getAttribute('data-bs-slide-to')\n\n if (slideIndex) {\n config.interval = false\n }\n\n Carousel.carouselInterface(target, config)\n\n if (slideIndex) {\n Carousel.getInstance(target).to(slideIndex)\n }\n\n event.preventDefault()\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_SLIDE, Carousel.dataApiClickHandler)\n\nEventHandler.on(window, EVENT_LOAD_DATA_API, () => {\n const carousels = SelectorEngine.find(SELECTOR_DATA_RIDE)\n\n for (let i = 0, len = carousels.length; i < len; i++) {\n Carousel.carouselInterface(carousels[i], Carousel.getInstance(carousels[i]))\n }\n})\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Carousel to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Carousel)\n\nexport default Carousel\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): collapse.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport {\n defineJQueryPlugin,\n getElement,\n getSelectorFromElement,\n getElementFromSelector,\n reflow,\n typeCheckConfig\n} from './util/index'\nimport Data from './dom/data'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'collapse'\nconst DATA_KEY = 'bs.collapse'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\n\nconst Default = {\n toggle: true,\n parent: null\n}\n\nconst DefaultType = {\n toggle: 'boolean',\n parent: '(null|element)'\n}\n\nconst EVENT_SHOW = `show${EVENT_KEY}`\nconst EVENT_SHOWN = `shown${EVENT_KEY}`\nconst EVENT_HIDE = `hide${EVENT_KEY}`\nconst EVENT_HIDDEN = `hidden${EVENT_KEY}`\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\n\nconst CLASS_NAME_SHOW = 'show'\nconst CLASS_NAME_COLLAPSE = 'collapse'\nconst CLASS_NAME_COLLAPSING = 'collapsing'\nconst CLASS_NAME_COLLAPSED = 'collapsed'\nconst CLASS_NAME_HORIZONTAL = 'collapse-horizontal'\n\nconst WIDTH = 'width'\nconst HEIGHT = 'height'\n\nconst SELECTOR_ACTIVES = '.show, .collapsing'\nconst SELECTOR_DATA_TOGGLE = '[data-bs-toggle=\"collapse\"]'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Collapse extends BaseComponent {\n constructor(element, config) {\n super(element)\n\n this._isTransitioning = false\n this._config = this._getConfig(config)\n this._triggerArray = []\n\n const toggleList = SelectorEngine.find(SELECTOR_DATA_TOGGLE)\n\n for (let i = 0, len = toggleList.length; i < len; i++) {\n const elem = toggleList[i]\n const selector = getSelectorFromElement(elem)\n const filterElement = SelectorEngine.find(selector)\n .filter(foundElem => foundElem === this._element)\n\n if (selector !== null && filterElement.length) {\n this._selector = selector\n this._triggerArray.push(elem)\n }\n }\n\n this._initializeChildren()\n\n if (!this._config.parent) {\n this._addAriaAndCollapsedClass(this._triggerArray, this._isShown())\n }\n\n if (this._config.toggle) {\n this.toggle()\n }\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n toggle() {\n if (this._isShown()) {\n this.hide()\n } else {\n this.show()\n }\n }\n\n show() {\n if (this._isTransitioning || this._isShown()) {\n return\n }\n\n let actives = []\n let activesData\n\n if (this._config.parent) {\n const children = SelectorEngine.find(`.${CLASS_NAME_COLLAPSE} .${CLASS_NAME_COLLAPSE}`, this._config.parent)\n actives = SelectorEngine.find(SELECTOR_ACTIVES, this._config.parent).filter(elem => !children.includes(elem)) // remove children if greater depth\n }\n\n const container = SelectorEngine.findOne(this._selector)\n if (actives.length) {\n const tempActiveData = actives.find(elem => container !== elem)\n activesData = tempActiveData ? Collapse.getInstance(tempActiveData) : null\n\n if (activesData && activesData._isTransitioning) {\n return\n }\n }\n\n const startEvent = EventHandler.trigger(this._element, EVENT_SHOW)\n if (startEvent.defaultPrevented) {\n return\n }\n\n actives.forEach(elemActive => {\n if (container !== elemActive) {\n Collapse.getOrCreateInstance(elemActive, { toggle: false }).hide()\n }\n\n if (!activesData) {\n Data.set(elemActive, DATA_KEY, null)\n }\n })\n\n const dimension = this._getDimension()\n\n this._element.classList.remove(CLASS_NAME_COLLAPSE)\n this._element.classList.add(CLASS_NAME_COLLAPSING)\n\n this._element.style[dimension] = 0\n\n this._addAriaAndCollapsedClass(this._triggerArray, true)\n this._isTransitioning = true\n\n const complete = () => {\n this._isTransitioning = false\n\n this._element.classList.remove(CLASS_NAME_COLLAPSING)\n this._element.classList.add(CLASS_NAME_COLLAPSE, CLASS_NAME_SHOW)\n\n this._element.style[dimension] = ''\n\n EventHandler.trigger(this._element, EVENT_SHOWN)\n }\n\n const capitalizedDimension = dimension[0].toUpperCase() + dimension.slice(1)\n const scrollSize = `scroll${capitalizedDimension}`\n\n this._queueCallback(complete, this._element, true)\n this._element.style[dimension] = `${this._element[scrollSize]}px`\n }\n\n hide() {\n if (this._isTransitioning || !this._isShown()) {\n return\n }\n\n const startEvent = EventHandler.trigger(this._element, EVENT_HIDE)\n if (startEvent.defaultPrevented) {\n return\n }\n\n const dimension = this._getDimension()\n\n this._element.style[dimension] = `${this._element.getBoundingClientRect()[dimension]}px`\n\n reflow(this._element)\n\n this._element.classList.add(CLASS_NAME_COLLAPSING)\n this._element.classList.remove(CLASS_NAME_COLLAPSE, CLASS_NAME_SHOW)\n\n const triggerArrayLength = this._triggerArray.length\n for (let i = 0; i < triggerArrayLength; i++) {\n const trigger = this._triggerArray[i]\n const elem = getElementFromSelector(trigger)\n\n if (elem && !this._isShown(elem)) {\n this._addAriaAndCollapsedClass([trigger], false)\n }\n }\n\n this._isTransitioning = true\n\n const complete = () => {\n this._isTransitioning = false\n this._element.classList.remove(CLASS_NAME_COLLAPSING)\n this._element.classList.add(CLASS_NAME_COLLAPSE)\n EventHandler.trigger(this._element, EVENT_HIDDEN)\n }\n\n this._element.style[dimension] = ''\n\n this._queueCallback(complete, this._element, true)\n }\n\n _isShown(element = this._element) {\n return element.classList.contains(CLASS_NAME_SHOW)\n }\n\n // Private\n\n _getConfig(config) {\n config = {\n ...Default,\n ...Manipulator.getDataAttributes(this._element),\n ...config\n }\n config.toggle = Boolean(config.toggle) // Coerce string values\n config.parent = getElement(config.parent)\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n\n _getDimension() {\n return this._element.classList.contains(CLASS_NAME_HORIZONTAL) ? WIDTH : HEIGHT\n }\n\n _initializeChildren() {\n if (!this._config.parent) {\n return\n }\n\n const children = SelectorEngine.find(`.${CLASS_NAME_COLLAPSE} .${CLASS_NAME_COLLAPSE}`, this._config.parent)\n SelectorEngine.find(SELECTOR_DATA_TOGGLE, this._config.parent).filter(elem => !children.includes(elem))\n .forEach(element => {\n const selected = getElementFromSelector(element)\n\n if (selected) {\n this._addAriaAndCollapsedClass([element], this._isShown(selected))\n }\n })\n }\n\n _addAriaAndCollapsedClass(triggerArray, isOpen) {\n if (!triggerArray.length) {\n return\n }\n\n triggerArray.forEach(elem => {\n if (isOpen) {\n elem.classList.remove(CLASS_NAME_COLLAPSED)\n } else {\n elem.classList.add(CLASS_NAME_COLLAPSED)\n }\n\n elem.setAttribute('aria-expanded', isOpen)\n })\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const _config = {}\n if (typeof config === 'string' && /show|hide/.test(config)) {\n _config.toggle = false\n }\n\n const data = Collapse.getOrCreateInstance(this, _config)\n\n if (typeof config === 'string') {\n if (typeof data[config] === 'undefined') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config]()\n }\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_TOGGLE, function (event) {\n // preventDefault only for elements (which change the URL) not inside the collapsible element\n if (event.target.tagName === 'A' || (event.delegateTarget && event.delegateTarget.tagName === 'A')) {\n event.preventDefault()\n }\n\n const selector = getSelectorFromElement(this)\n const selectorElements = SelectorEngine.find(selector)\n\n selectorElements.forEach(element => {\n Collapse.getOrCreateInstance(element, { toggle: false }).toggle()\n })\n})\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Collapse to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Collapse)\n\nexport default Collapse\n","export var top = 'top';\nexport var bottom = 'bottom';\nexport var right = 'right';\nexport var left = 'left';\nexport var auto = 'auto';\nexport var basePlacements = [top, bottom, right, left];\nexport var start = 'start';\nexport var end = 'end';\nexport var clippingParents = 'clippingParents';\nexport var viewport = 'viewport';\nexport var popper = 'popper';\nexport var reference = 'reference';\nexport var variationPlacements = /*#__PURE__*/basePlacements.reduce(function (acc, placement) {\n return acc.concat([placement + \"-\" + start, placement + \"-\" + end]);\n}, []);\nexport var placements = /*#__PURE__*/[].concat(basePlacements, [auto]).reduce(function (acc, placement) {\n return acc.concat([placement, placement + \"-\" + start, placement + \"-\" + end]);\n}, []); // modifiers that need to read the DOM\n\nexport var beforeRead = 'beforeRead';\nexport var read = 'read';\nexport var afterRead = 'afterRead'; // pure-logic modifiers\n\nexport var beforeMain = 'beforeMain';\nexport var main = 'main';\nexport var afterMain = 'afterMain'; // modifier with the purpose to write to the DOM (or write into a framework state)\n\nexport var beforeWrite = 'beforeWrite';\nexport var write = 'write';\nexport var afterWrite = 'afterWrite';\nexport var modifierPhases = [beforeRead, read, afterRead, beforeMain, main, afterMain, beforeWrite, write, afterWrite];","export default function getNodeName(element) {\n return element ? (element.nodeName || '').toLowerCase() : null;\n}","export default function getWindow(node) {\n if (node == null) {\n return window;\n }\n\n if (node.toString() !== '[object Window]') {\n var ownerDocument = node.ownerDocument;\n return ownerDocument ? ownerDocument.defaultView || window : window;\n }\n\n return node;\n}","import getWindow from \"./getWindow.js\";\n\nfunction isElement(node) {\n var OwnElement = getWindow(node).Element;\n return node instanceof OwnElement || node instanceof Element;\n}\n\nfunction isHTMLElement(node) {\n var OwnElement = getWindow(node).HTMLElement;\n return node instanceof OwnElement || node instanceof HTMLElement;\n}\n\nfunction isShadowRoot(node) {\n // IE 11 has no ShadowRoot\n if (typeof ShadowRoot === 'undefined') {\n return false;\n }\n\n var OwnElement = getWindow(node).ShadowRoot;\n return node instanceof OwnElement || node instanceof ShadowRoot;\n}\n\nexport { isElement, isHTMLElement, isShadowRoot };","import getNodeName from \"../dom-utils/getNodeName.js\";\nimport { isHTMLElement } from \"../dom-utils/instanceOf.js\"; // This modifier takes the styles prepared by the `computeStyles` modifier\n// and applies them to the HTMLElements such as popper and arrow\n\nfunction applyStyles(_ref) {\n var state = _ref.state;\n Object.keys(state.elements).forEach(function (name) {\n var style = state.styles[name] || {};\n var attributes = state.attributes[name] || {};\n var element = state.elements[name]; // arrow is optional + virtual elements\n\n if (!isHTMLElement(element) || !getNodeName(element)) {\n return;\n } // Flow doesn't support to extend this property, but it's the most\n // effective way to apply styles to an HTMLElement\n // $FlowFixMe[cannot-write]\n\n\n Object.assign(element.style, style);\n Object.keys(attributes).forEach(function (name) {\n var value = attributes[name];\n\n if (value === false) {\n element.removeAttribute(name);\n } else {\n element.setAttribute(name, value === true ? '' : value);\n }\n });\n });\n}\n\nfunction effect(_ref2) {\n var state = _ref2.state;\n var initialStyles = {\n popper: {\n position: state.options.strategy,\n left: '0',\n top: '0',\n margin: '0'\n },\n arrow: {\n position: 'absolute'\n },\n reference: {}\n };\n Object.assign(state.elements.popper.style, initialStyles.popper);\n state.styles = initialStyles;\n\n if (state.elements.arrow) {\n Object.assign(state.elements.arrow.style, initialStyles.arrow);\n }\n\n return function () {\n Object.keys(state.elements).forEach(function (name) {\n var element = state.elements[name];\n var attributes = state.attributes[name] || {};\n var styleProperties = Object.keys(state.styles.hasOwnProperty(name) ? state.styles[name] : initialStyles[name]); // Set all values to an empty string to unset them\n\n var style = styleProperties.reduce(function (style, property) {\n style[property] = '';\n return style;\n }, {}); // arrow is optional + virtual elements\n\n if (!isHTMLElement(element) || !getNodeName(element)) {\n return;\n }\n\n Object.assign(element.style, style);\n Object.keys(attributes).forEach(function (attribute) {\n element.removeAttribute(attribute);\n });\n });\n };\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'applyStyles',\n enabled: true,\n phase: 'write',\n fn: applyStyles,\n effect: effect,\n requires: ['computeStyles']\n};","import { auto } from \"../enums.js\";\nexport default function getBasePlacement(placement) {\n return placement.split('-')[0];\n}","import { isHTMLElement } from \"./instanceOf.js\";\nvar round = Math.round;\nexport default function getBoundingClientRect(element, includeScale) {\n if (includeScale === void 0) {\n includeScale = false;\n }\n\n var rect = element.getBoundingClientRect();\n var scaleX = 1;\n var scaleY = 1;\n\n if (isHTMLElement(element) && includeScale) {\n // Fallback to 1 in case both values are `0`\n scaleX = rect.width / element.offsetWidth || 1;\n scaleY = rect.height / element.offsetHeight || 1;\n }\n\n return {\n width: round(rect.width / scaleX),\n height: round(rect.height / scaleY),\n top: round(rect.top / scaleY),\n right: round(rect.right / scaleX),\n bottom: round(rect.bottom / scaleY),\n left: round(rect.left / scaleX),\n x: round(rect.left / scaleX),\n y: round(rect.top / scaleY)\n };\n}","import getBoundingClientRect from \"./getBoundingClientRect.js\"; // Returns the layout rect of an element relative to its offsetParent. Layout\n// means it doesn't take into account transforms.\n\nexport default function getLayoutRect(element) {\n var clientRect = getBoundingClientRect(element); // Use the clientRect sizes if it's not been transformed.\n // Fixes https://github.com/popperjs/popper-core/issues/1223\n\n var width = element.offsetWidth;\n var height = element.offsetHeight;\n\n if (Math.abs(clientRect.width - width) <= 1) {\n width = clientRect.width;\n }\n\n if (Math.abs(clientRect.height - height) <= 1) {\n height = clientRect.height;\n }\n\n return {\n x: element.offsetLeft,\n y: element.offsetTop,\n width: width,\n height: height\n };\n}","import { isShadowRoot } from \"./instanceOf.js\";\nexport default function contains(parent, child) {\n var rootNode = child.getRootNode && child.getRootNode(); // First, attempt with faster native method\n\n if (parent.contains(child)) {\n return true;\n } // then fallback to custom implementation with Shadow DOM support\n else if (rootNode && isShadowRoot(rootNode)) {\n var next = child;\n\n do {\n if (next && parent.isSameNode(next)) {\n return true;\n } // $FlowFixMe[prop-missing]: need a better way to handle this...\n\n\n next = next.parentNode || next.host;\n } while (next);\n } // Give up, the result is false\n\n\n return false;\n}","import getWindow from \"./getWindow.js\";\nexport default function getComputedStyle(element) {\n return getWindow(element).getComputedStyle(element);\n}","import getNodeName from \"./getNodeName.js\";\nexport default function isTableElement(element) {\n return ['table', 'td', 'th'].indexOf(getNodeName(element)) >= 0;\n}","import { isElement } from \"./instanceOf.js\";\nexport default function getDocumentElement(element) {\n // $FlowFixMe[incompatible-return]: assume body is always available\n return ((isElement(element) ? element.ownerDocument : // $FlowFixMe[prop-missing]\n element.document) || window.document).documentElement;\n}","import getNodeName from \"./getNodeName.js\";\nimport getDocumentElement from \"./getDocumentElement.js\";\nimport { isShadowRoot } from \"./instanceOf.js\";\nexport default function getParentNode(element) {\n if (getNodeName(element) === 'html') {\n return element;\n }\n\n return (// this is a quicker (but less type safe) way to save quite some bytes from the bundle\n // $FlowFixMe[incompatible-return]\n // $FlowFixMe[prop-missing]\n element.assignedSlot || // step into the shadow DOM of the parent of a slotted node\n element.parentNode || ( // DOM Element detected\n isShadowRoot(element) ? element.host : null) || // ShadowRoot detected\n // $FlowFixMe[incompatible-call]: HTMLElement is a Node\n getDocumentElement(element) // fallback\n\n );\n}","import getWindow from \"./getWindow.js\";\nimport getNodeName from \"./getNodeName.js\";\nimport getComputedStyle from \"./getComputedStyle.js\";\nimport { isHTMLElement } from \"./instanceOf.js\";\nimport isTableElement from \"./isTableElement.js\";\nimport getParentNode from \"./getParentNode.js\";\n\nfunction getTrueOffsetParent(element) {\n if (!isHTMLElement(element) || // https://github.com/popperjs/popper-core/issues/837\n getComputedStyle(element).position === 'fixed') {\n return null;\n }\n\n return element.offsetParent;\n} // `.offsetParent` reports `null` for fixed elements, while absolute elements\n// return the containing block\n\n\nfunction getContainingBlock(element) {\n var isFirefox = navigator.userAgent.toLowerCase().indexOf('firefox') !== -1;\n var isIE = navigator.userAgent.indexOf('Trident') !== -1;\n\n if (isIE && isHTMLElement(element)) {\n // In IE 9, 10 and 11 fixed elements containing block is always established by the viewport\n var elementCss = getComputedStyle(element);\n\n if (elementCss.position === 'fixed') {\n return null;\n }\n }\n\n var currentNode = getParentNode(element);\n\n while (isHTMLElement(currentNode) && ['html', 'body'].indexOf(getNodeName(currentNode)) < 0) {\n var css = getComputedStyle(currentNode); // This is non-exhaustive but covers the most common CSS properties that\n // create a containing block.\n // https://developer.mozilla.org/en-US/docs/Web/CSS/Containing_block#identifying_the_containing_block\n\n if (css.transform !== 'none' || css.perspective !== 'none' || css.contain === 'paint' || ['transform', 'perspective'].indexOf(css.willChange) !== -1 || isFirefox && css.willChange === 'filter' || isFirefox && css.filter && css.filter !== 'none') {\n return currentNode;\n } else {\n currentNode = currentNode.parentNode;\n }\n }\n\n return null;\n} // Gets the closest ancestor positioned element. Handles some edge cases,\n// such as table ancestors and cross browser bugs.\n\n\nexport default function getOffsetParent(element) {\n var window = getWindow(element);\n var offsetParent = getTrueOffsetParent(element);\n\n while (offsetParent && isTableElement(offsetParent) && getComputedStyle(offsetParent).position === 'static') {\n offsetParent = getTrueOffsetParent(offsetParent);\n }\n\n if (offsetParent && (getNodeName(offsetParent) === 'html' || getNodeName(offsetParent) === 'body' && getComputedStyle(offsetParent).position === 'static')) {\n return window;\n }\n\n return offsetParent || getContainingBlock(element) || window;\n}","export default function getMainAxisFromPlacement(placement) {\n return ['top', 'bottom'].indexOf(placement) >= 0 ? 'x' : 'y';\n}","export var max = Math.max;\nexport var min = Math.min;\nexport var round = Math.round;","import { max as mathMax, min as mathMin } from \"./math.js\";\nexport default function within(min, value, max) {\n return mathMax(min, mathMin(value, max));\n}","import getFreshSideObject from \"./getFreshSideObject.js\";\nexport default function mergePaddingObject(paddingObject) {\n return Object.assign({}, getFreshSideObject(), paddingObject);\n}","export default function getFreshSideObject() {\n return {\n top: 0,\n right: 0,\n bottom: 0,\n left: 0\n };\n}","export default function expandToHashMap(value, keys) {\n return keys.reduce(function (hashMap, key) {\n hashMap[key] = value;\n return hashMap;\n }, {});\n}","import getBasePlacement from \"../utils/getBasePlacement.js\";\nimport getLayoutRect from \"../dom-utils/getLayoutRect.js\";\nimport contains from \"../dom-utils/contains.js\";\nimport getOffsetParent from \"../dom-utils/getOffsetParent.js\";\nimport getMainAxisFromPlacement from \"../utils/getMainAxisFromPlacement.js\";\nimport within from \"../utils/within.js\";\nimport mergePaddingObject from \"../utils/mergePaddingObject.js\";\nimport expandToHashMap from \"../utils/expandToHashMap.js\";\nimport { left, right, basePlacements, top, bottom } from \"../enums.js\";\nimport { isHTMLElement } from \"../dom-utils/instanceOf.js\"; // eslint-disable-next-line import/no-unused-modules\n\nvar toPaddingObject = function toPaddingObject(padding, state) {\n padding = typeof padding === 'function' ? padding(Object.assign({}, state.rects, {\n placement: state.placement\n })) : padding;\n return mergePaddingObject(typeof padding !== 'number' ? padding : expandToHashMap(padding, basePlacements));\n};\n\nfunction arrow(_ref) {\n var _state$modifiersData$;\n\n var state = _ref.state,\n name = _ref.name,\n options = _ref.options;\n var arrowElement = state.elements.arrow;\n var popperOffsets = state.modifiersData.popperOffsets;\n var basePlacement = getBasePlacement(state.placement);\n var axis = getMainAxisFromPlacement(basePlacement);\n var isVertical = [left, right].indexOf(basePlacement) >= 0;\n var len = isVertical ? 'height' : 'width';\n\n if (!arrowElement || !popperOffsets) {\n return;\n }\n\n var paddingObject = toPaddingObject(options.padding, state);\n var arrowRect = getLayoutRect(arrowElement);\n var minProp = axis === 'y' ? top : left;\n var maxProp = axis === 'y' ? bottom : right;\n var endDiff = state.rects.reference[len] + state.rects.reference[axis] - popperOffsets[axis] - state.rects.popper[len];\n var startDiff = popperOffsets[axis] - state.rects.reference[axis];\n var arrowOffsetParent = getOffsetParent(arrowElement);\n var clientSize = arrowOffsetParent ? axis === 'y' ? arrowOffsetParent.clientHeight || 0 : arrowOffsetParent.clientWidth || 0 : 0;\n var centerToReference = endDiff / 2 - startDiff / 2; // Make sure the arrow doesn't overflow the popper if the center point is\n // outside of the popper bounds\n\n var min = paddingObject[minProp];\n var max = clientSize - arrowRect[len] - paddingObject[maxProp];\n var center = clientSize / 2 - arrowRect[len] / 2 + centerToReference;\n var offset = within(min, center, max); // Prevents breaking syntax highlighting...\n\n var axisProp = axis;\n state.modifiersData[name] = (_state$modifiersData$ = {}, _state$modifiersData$[axisProp] = offset, _state$modifiersData$.centerOffset = offset - center, _state$modifiersData$);\n}\n\nfunction effect(_ref2) {\n var state = _ref2.state,\n options = _ref2.options;\n var _options$element = options.element,\n arrowElement = _options$element === void 0 ? '[data-popper-arrow]' : _options$element;\n\n if (arrowElement == null) {\n return;\n } // CSS selector\n\n\n if (typeof arrowElement === 'string') {\n arrowElement = state.elements.popper.querySelector(arrowElement);\n\n if (!arrowElement) {\n return;\n }\n }\n\n if (process.env.NODE_ENV !== \"production\") {\n if (!isHTMLElement(arrowElement)) {\n console.error(['Popper: \"arrow\" element must be an HTMLElement (not an SVGElement).', 'To use an SVG arrow, wrap it in an HTMLElement that will be used as', 'the arrow.'].join(' '));\n }\n }\n\n if (!contains(state.elements.popper, arrowElement)) {\n if (process.env.NODE_ENV !== \"production\") {\n console.error(['Popper: \"arrow\" modifier\\'s `element` must be a child of the popper', 'element.'].join(' '));\n }\n\n return;\n }\n\n state.elements.arrow = arrowElement;\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'arrow',\n enabled: true,\n phase: 'main',\n fn: arrow,\n effect: effect,\n requires: ['popperOffsets'],\n requiresIfExists: ['preventOverflow']\n};","import { top, left, right, bottom } from \"../enums.js\";\nimport getOffsetParent from \"../dom-utils/getOffsetParent.js\";\nimport getWindow from \"../dom-utils/getWindow.js\";\nimport getDocumentElement from \"../dom-utils/getDocumentElement.js\";\nimport getComputedStyle from \"../dom-utils/getComputedStyle.js\";\nimport getBasePlacement from \"../utils/getBasePlacement.js\";\nimport { round } from \"../utils/math.js\"; // eslint-disable-next-line import/no-unused-modules\n\nvar unsetSides = {\n top: 'auto',\n right: 'auto',\n bottom: 'auto',\n left: 'auto'\n}; // Round the offsets to the nearest suitable subpixel based on the DPR.\n// Zooming can change the DPR, but it seems to report a value that will\n// cleanly divide the values into the appropriate subpixels.\n\nfunction roundOffsetsByDPR(_ref) {\n var x = _ref.x,\n y = _ref.y;\n var win = window;\n var dpr = win.devicePixelRatio || 1;\n return {\n x: round(round(x * dpr) / dpr) || 0,\n y: round(round(y * dpr) / dpr) || 0\n };\n}\n\nexport function mapToStyles(_ref2) {\n var _Object$assign2;\n\n var popper = _ref2.popper,\n popperRect = _ref2.popperRect,\n placement = _ref2.placement,\n offsets = _ref2.offsets,\n position = _ref2.position,\n gpuAcceleration = _ref2.gpuAcceleration,\n adaptive = _ref2.adaptive,\n roundOffsets = _ref2.roundOffsets;\n\n var _ref3 = roundOffsets === true ? roundOffsetsByDPR(offsets) : typeof roundOffsets === 'function' ? roundOffsets(offsets) : offsets,\n _ref3$x = _ref3.x,\n x = _ref3$x === void 0 ? 0 : _ref3$x,\n _ref3$y = _ref3.y,\n y = _ref3$y === void 0 ? 0 : _ref3$y;\n\n var hasX = offsets.hasOwnProperty('x');\n var hasY = offsets.hasOwnProperty('y');\n var sideX = left;\n var sideY = top;\n var win = window;\n\n if (adaptive) {\n var offsetParent = getOffsetParent(popper);\n var heightProp = 'clientHeight';\n var widthProp = 'clientWidth';\n\n if (offsetParent === getWindow(popper)) {\n offsetParent = getDocumentElement(popper);\n\n if (getComputedStyle(offsetParent).position !== 'static') {\n heightProp = 'scrollHeight';\n widthProp = 'scrollWidth';\n }\n } // $FlowFixMe[incompatible-cast]: force type refinement, we compare offsetParent with window above, but Flow doesn't detect it\n\n\n offsetParent = offsetParent;\n\n if (placement === top) {\n sideY = bottom; // $FlowFixMe[prop-missing]\n\n y -= offsetParent[heightProp] - popperRect.height;\n y *= gpuAcceleration ? 1 : -1;\n }\n\n if (placement === left) {\n sideX = right; // $FlowFixMe[prop-missing]\n\n x -= offsetParent[widthProp] - popperRect.width;\n x *= gpuAcceleration ? 1 : -1;\n }\n }\n\n var commonStyles = Object.assign({\n position: position\n }, adaptive && unsetSides);\n\n if (gpuAcceleration) {\n var _Object$assign;\n\n return Object.assign({}, commonStyles, (_Object$assign = {}, _Object$assign[sideY] = hasY ? '0' : '', _Object$assign[sideX] = hasX ? '0' : '', _Object$assign.transform = (win.devicePixelRatio || 1) < 2 ? \"translate(\" + x + \"px, \" + y + \"px)\" : \"translate3d(\" + x + \"px, \" + y + \"px, 0)\", _Object$assign));\n }\n\n return Object.assign({}, commonStyles, (_Object$assign2 = {}, _Object$assign2[sideY] = hasY ? y + \"px\" : '', _Object$assign2[sideX] = hasX ? x + \"px\" : '', _Object$assign2.transform = '', _Object$assign2));\n}\n\nfunction computeStyles(_ref4) {\n var state = _ref4.state,\n options = _ref4.options;\n var _options$gpuAccelerat = options.gpuAcceleration,\n gpuAcceleration = _options$gpuAccelerat === void 0 ? true : _options$gpuAccelerat,\n _options$adaptive = options.adaptive,\n adaptive = _options$adaptive === void 0 ? true : _options$adaptive,\n _options$roundOffsets = options.roundOffsets,\n roundOffsets = _options$roundOffsets === void 0 ? true : _options$roundOffsets;\n\n if (process.env.NODE_ENV !== \"production\") {\n var transitionProperty = getComputedStyle(state.elements.popper).transitionProperty || '';\n\n if (adaptive && ['transform', 'top', 'right', 'bottom', 'left'].some(function (property) {\n return transitionProperty.indexOf(property) >= 0;\n })) {\n console.warn(['Popper: Detected CSS transitions on at least one of the following', 'CSS properties: \"transform\", \"top\", \"right\", \"bottom\", \"left\".', '\\n\\n', 'Disable the \"computeStyles\" modifier\\'s `adaptive` option to allow', 'for smooth transitions, or remove these properties from the CSS', 'transition declaration on the popper element if only transitioning', 'opacity or background-color for example.', '\\n\\n', 'We recommend using the popper element as a wrapper around an inner', 'element that can have any CSS property transitioned for animations.'].join(' '));\n }\n }\n\n var commonStyles = {\n placement: getBasePlacement(state.placement),\n popper: state.elements.popper,\n popperRect: state.rects.popper,\n gpuAcceleration: gpuAcceleration\n };\n\n if (state.modifiersData.popperOffsets != null) {\n state.styles.popper = Object.assign({}, state.styles.popper, mapToStyles(Object.assign({}, commonStyles, {\n offsets: state.modifiersData.popperOffsets,\n position: state.options.strategy,\n adaptive: adaptive,\n roundOffsets: roundOffsets\n })));\n }\n\n if (state.modifiersData.arrow != null) {\n state.styles.arrow = Object.assign({}, state.styles.arrow, mapToStyles(Object.assign({}, commonStyles, {\n offsets: state.modifiersData.arrow,\n position: 'absolute',\n adaptive: false,\n roundOffsets: roundOffsets\n })));\n }\n\n state.attributes.popper = Object.assign({}, state.attributes.popper, {\n 'data-popper-placement': state.placement\n });\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'computeStyles',\n enabled: true,\n phase: 'beforeWrite',\n fn: computeStyles,\n data: {}\n};","import getWindow from \"../dom-utils/getWindow.js\"; // eslint-disable-next-line import/no-unused-modules\n\nvar passive = {\n passive: true\n};\n\nfunction effect(_ref) {\n var state = _ref.state,\n instance = _ref.instance,\n options = _ref.options;\n var _options$scroll = options.scroll,\n scroll = _options$scroll === void 0 ? true : _options$scroll,\n _options$resize = options.resize,\n resize = _options$resize === void 0 ? true : _options$resize;\n var window = getWindow(state.elements.popper);\n var scrollParents = [].concat(state.scrollParents.reference, state.scrollParents.popper);\n\n if (scroll) {\n scrollParents.forEach(function (scrollParent) {\n scrollParent.addEventListener('scroll', instance.update, passive);\n });\n }\n\n if (resize) {\n window.addEventListener('resize', instance.update, passive);\n }\n\n return function () {\n if (scroll) {\n scrollParents.forEach(function (scrollParent) {\n scrollParent.removeEventListener('scroll', instance.update, passive);\n });\n }\n\n if (resize) {\n window.removeEventListener('resize', instance.update, passive);\n }\n };\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'eventListeners',\n enabled: true,\n phase: 'write',\n fn: function fn() {},\n effect: effect,\n data: {}\n};","var hash = {\n left: 'right',\n right: 'left',\n bottom: 'top',\n top: 'bottom'\n};\nexport default function getOppositePlacement(placement) {\n return placement.replace(/left|right|bottom|top/g, function (matched) {\n return hash[matched];\n });\n}","var hash = {\n start: 'end',\n end: 'start'\n};\nexport default function getOppositeVariationPlacement(placement) {\n return placement.replace(/start|end/g, function (matched) {\n return hash[matched];\n });\n}","import getWindow from \"./getWindow.js\";\nexport default function getWindowScroll(node) {\n var win = getWindow(node);\n var scrollLeft = win.pageXOffset;\n var scrollTop = win.pageYOffset;\n return {\n scrollLeft: scrollLeft,\n scrollTop: scrollTop\n };\n}","import getBoundingClientRect from \"./getBoundingClientRect.js\";\nimport getDocumentElement from \"./getDocumentElement.js\";\nimport getWindowScroll from \"./getWindowScroll.js\";\nexport default function getWindowScrollBarX(element) {\n // If has a CSS width greater than the viewport, then this will be\n // incorrect for RTL.\n // Popper 1 is broken in this case and never had a bug report so let's assume\n // it's not an issue. I don't think anyone ever specifies width on \n // anyway.\n // Browsers where the left scrollbar doesn't cause an issue report `0` for\n // this (e.g. Edge 2019, IE11, Safari)\n return getBoundingClientRect(getDocumentElement(element)).left + getWindowScroll(element).scrollLeft;\n}","import getComputedStyle from \"./getComputedStyle.js\";\nexport default function isScrollParent(element) {\n // Firefox wants us to check `-x` and `-y` variations as well\n var _getComputedStyle = getComputedStyle(element),\n overflow = _getComputedStyle.overflow,\n overflowX = _getComputedStyle.overflowX,\n overflowY = _getComputedStyle.overflowY;\n\n return /auto|scroll|overlay|hidden/.test(overflow + overflowY + overflowX);\n}","import getScrollParent from \"./getScrollParent.js\";\nimport getParentNode from \"./getParentNode.js\";\nimport getWindow from \"./getWindow.js\";\nimport isScrollParent from \"./isScrollParent.js\";\n/*\ngiven a DOM element, return the list of all scroll parents, up the list of ancesors\nuntil we get to the top window object. This list is what we attach scroll listeners\nto, because if any of these parent elements scroll, we'll need to re-calculate the\nreference element's position.\n*/\n\nexport default function listScrollParents(element, list) {\n var _element$ownerDocumen;\n\n if (list === void 0) {\n list = [];\n }\n\n var scrollParent = getScrollParent(element);\n var isBody = scrollParent === ((_element$ownerDocumen = element.ownerDocument) == null ? void 0 : _element$ownerDocumen.body);\n var win = getWindow(scrollParent);\n var target = isBody ? [win].concat(win.visualViewport || [], isScrollParent(scrollParent) ? scrollParent : []) : scrollParent;\n var updatedList = list.concat(target);\n return isBody ? updatedList : // $FlowFixMe[incompatible-call]: isBody tells us target will be an HTMLElement here\n updatedList.concat(listScrollParents(getParentNode(target)));\n}","import getParentNode from \"./getParentNode.js\";\nimport isScrollParent from \"./isScrollParent.js\";\nimport getNodeName from \"./getNodeName.js\";\nimport { isHTMLElement } from \"./instanceOf.js\";\nexport default function getScrollParent(node) {\n if (['html', 'body', '#document'].indexOf(getNodeName(node)) >= 0) {\n // $FlowFixMe[incompatible-return]: assume body is always available\n return node.ownerDocument.body;\n }\n\n if (isHTMLElement(node) && isScrollParent(node)) {\n return node;\n }\n\n return getScrollParent(getParentNode(node));\n}","export default function rectToClientRect(rect) {\n return Object.assign({}, rect, {\n left: rect.x,\n top: rect.y,\n right: rect.x + rect.width,\n bottom: rect.y + rect.height\n });\n}","import { viewport } from \"../enums.js\";\nimport getViewportRect from \"./getViewportRect.js\";\nimport getDocumentRect from \"./getDocumentRect.js\";\nimport listScrollParents from \"./listScrollParents.js\";\nimport getOffsetParent from \"./getOffsetParent.js\";\nimport getDocumentElement from \"./getDocumentElement.js\";\nimport getComputedStyle from \"./getComputedStyle.js\";\nimport { isElement, isHTMLElement } from \"./instanceOf.js\";\nimport getBoundingClientRect from \"./getBoundingClientRect.js\";\nimport getParentNode from \"./getParentNode.js\";\nimport contains from \"./contains.js\";\nimport getNodeName from \"./getNodeName.js\";\nimport rectToClientRect from \"../utils/rectToClientRect.js\";\nimport { max, min } from \"../utils/math.js\";\n\nfunction getInnerBoundingClientRect(element) {\n var rect = getBoundingClientRect(element);\n rect.top = rect.top + element.clientTop;\n rect.left = rect.left + element.clientLeft;\n rect.bottom = rect.top + element.clientHeight;\n rect.right = rect.left + element.clientWidth;\n rect.width = element.clientWidth;\n rect.height = element.clientHeight;\n rect.x = rect.left;\n rect.y = rect.top;\n return rect;\n}\n\nfunction getClientRectFromMixedType(element, clippingParent) {\n return clippingParent === viewport ? rectToClientRect(getViewportRect(element)) : isHTMLElement(clippingParent) ? getInnerBoundingClientRect(clippingParent) : rectToClientRect(getDocumentRect(getDocumentElement(element)));\n} // A \"clipping parent\" is an overflowable container with the characteristic of\n// clipping (or hiding) overflowing elements with a position different from\n// `initial`\n\n\nfunction getClippingParents(element) {\n var clippingParents = listScrollParents(getParentNode(element));\n var canEscapeClipping = ['absolute', 'fixed'].indexOf(getComputedStyle(element).position) >= 0;\n var clipperElement = canEscapeClipping && isHTMLElement(element) ? getOffsetParent(element) : element;\n\n if (!isElement(clipperElement)) {\n return [];\n } // $FlowFixMe[incompatible-return]: https://github.com/facebook/flow/issues/1414\n\n\n return clippingParents.filter(function (clippingParent) {\n return isElement(clippingParent) && contains(clippingParent, clipperElement) && getNodeName(clippingParent) !== 'body';\n });\n} // Gets the maximum area that the element is visible in due to any number of\n// clipping parents\n\n\nexport default function getClippingRect(element, boundary, rootBoundary) {\n var mainClippingParents = boundary === 'clippingParents' ? getClippingParents(element) : [].concat(boundary);\n var clippingParents = [].concat(mainClippingParents, [rootBoundary]);\n var firstClippingParent = clippingParents[0];\n var clippingRect = clippingParents.reduce(function (accRect, clippingParent) {\n var rect = getClientRectFromMixedType(element, clippingParent);\n accRect.top = max(rect.top, accRect.top);\n accRect.right = min(rect.right, accRect.right);\n accRect.bottom = min(rect.bottom, accRect.bottom);\n accRect.left = max(rect.left, accRect.left);\n return accRect;\n }, getClientRectFromMixedType(element, firstClippingParent));\n clippingRect.width = clippingRect.right - clippingRect.left;\n clippingRect.height = clippingRect.bottom - clippingRect.top;\n clippingRect.x = clippingRect.left;\n clippingRect.y = clippingRect.top;\n return clippingRect;\n}","import getWindow from \"./getWindow.js\";\nimport getDocumentElement from \"./getDocumentElement.js\";\nimport getWindowScrollBarX from \"./getWindowScrollBarX.js\";\nexport default function getViewportRect(element) {\n var win = getWindow(element);\n var html = getDocumentElement(element);\n var visualViewport = win.visualViewport;\n var width = html.clientWidth;\n var height = html.clientHeight;\n var x = 0;\n var y = 0; // NB: This isn't supported on iOS <= 12. If the keyboard is open, the popper\n // can be obscured underneath it.\n // Also, `html.clientHeight` adds the bottom bar height in Safari iOS, even\n // if it isn't open, so if this isn't available, the popper will be detected\n // to overflow the bottom of the screen too early.\n\n if (visualViewport) {\n width = visualViewport.width;\n height = visualViewport.height; // Uses Layout Viewport (like Chrome; Safari does not currently)\n // In Chrome, it returns a value very close to 0 (+/-) but contains rounding\n // errors due to floating point numbers, so we need to check precision.\n // Safari returns a number <= 0, usually < -1 when pinch-zoomed\n // Feature detection fails in mobile emulation mode in Chrome.\n // Math.abs(win.innerWidth / visualViewport.scale - visualViewport.width) <\n // 0.001\n // Fallback here: \"Not Safari\" userAgent\n\n if (!/^((?!chrome|android).)*safari/i.test(navigator.userAgent)) {\n x = visualViewport.offsetLeft;\n y = visualViewport.offsetTop;\n }\n }\n\n return {\n width: width,\n height: height,\n x: x + getWindowScrollBarX(element),\n y: y\n };\n}","import getDocumentElement from \"./getDocumentElement.js\";\nimport getComputedStyle from \"./getComputedStyle.js\";\nimport getWindowScrollBarX from \"./getWindowScrollBarX.js\";\nimport getWindowScroll from \"./getWindowScroll.js\";\nimport { max } from \"../utils/math.js\"; // Gets the entire size of the scrollable document area, even extending outside\n// of the `` and `` rect bounds if horizontally scrollable\n\nexport default function getDocumentRect(element) {\n var _element$ownerDocumen;\n\n var html = getDocumentElement(element);\n var winScroll = getWindowScroll(element);\n var body = (_element$ownerDocumen = element.ownerDocument) == null ? void 0 : _element$ownerDocumen.body;\n var width = max(html.scrollWidth, html.clientWidth, body ? body.scrollWidth : 0, body ? body.clientWidth : 0);\n var height = max(html.scrollHeight, html.clientHeight, body ? body.scrollHeight : 0, body ? body.clientHeight : 0);\n var x = -winScroll.scrollLeft + getWindowScrollBarX(element);\n var y = -winScroll.scrollTop;\n\n if (getComputedStyle(body || html).direction === 'rtl') {\n x += max(html.clientWidth, body ? body.clientWidth : 0) - width;\n }\n\n return {\n width: width,\n height: height,\n x: x,\n y: y\n };\n}","export default function getVariation(placement) {\n return placement.split('-')[1];\n}","import getBasePlacement from \"./getBasePlacement.js\";\nimport getVariation from \"./getVariation.js\";\nimport getMainAxisFromPlacement from \"./getMainAxisFromPlacement.js\";\nimport { top, right, bottom, left, start, end } from \"../enums.js\";\nexport default function computeOffsets(_ref) {\n var reference = _ref.reference,\n element = _ref.element,\n placement = _ref.placement;\n var basePlacement = placement ? getBasePlacement(placement) : null;\n var variation = placement ? getVariation(placement) : null;\n var commonX = reference.x + reference.width / 2 - element.width / 2;\n var commonY = reference.y + reference.height / 2 - element.height / 2;\n var offsets;\n\n switch (basePlacement) {\n case top:\n offsets = {\n x: commonX,\n y: reference.y - element.height\n };\n break;\n\n case bottom:\n offsets = {\n x: commonX,\n y: reference.y + reference.height\n };\n break;\n\n case right:\n offsets = {\n x: reference.x + reference.width,\n y: commonY\n };\n break;\n\n case left:\n offsets = {\n x: reference.x - element.width,\n y: commonY\n };\n break;\n\n default:\n offsets = {\n x: reference.x,\n y: reference.y\n };\n }\n\n var mainAxis = basePlacement ? getMainAxisFromPlacement(basePlacement) : null;\n\n if (mainAxis != null) {\n var len = mainAxis === 'y' ? 'height' : 'width';\n\n switch (variation) {\n case start:\n offsets[mainAxis] = offsets[mainAxis] - (reference[len] / 2 - element[len] / 2);\n break;\n\n case end:\n offsets[mainAxis] = offsets[mainAxis] + (reference[len] / 2 - element[len] / 2);\n break;\n\n default:\n }\n }\n\n return offsets;\n}","import getBoundingClientRect from \"../dom-utils/getBoundingClientRect.js\";\nimport getClippingRect from \"../dom-utils/getClippingRect.js\";\nimport getDocumentElement from \"../dom-utils/getDocumentElement.js\";\nimport computeOffsets from \"./computeOffsets.js\";\nimport rectToClientRect from \"./rectToClientRect.js\";\nimport { clippingParents, reference, popper, bottom, top, right, basePlacements, viewport } from \"../enums.js\";\nimport { isElement } from \"../dom-utils/instanceOf.js\";\nimport mergePaddingObject from \"./mergePaddingObject.js\";\nimport expandToHashMap from \"./expandToHashMap.js\"; // eslint-disable-next-line import/no-unused-modules\n\nexport default function detectOverflow(state, options) {\n if (options === void 0) {\n options = {};\n }\n\n var _options = options,\n _options$placement = _options.placement,\n placement = _options$placement === void 0 ? state.placement : _options$placement,\n _options$boundary = _options.boundary,\n boundary = _options$boundary === void 0 ? clippingParents : _options$boundary,\n _options$rootBoundary = _options.rootBoundary,\n rootBoundary = _options$rootBoundary === void 0 ? viewport : _options$rootBoundary,\n _options$elementConte = _options.elementContext,\n elementContext = _options$elementConte === void 0 ? popper : _options$elementConte,\n _options$altBoundary = _options.altBoundary,\n altBoundary = _options$altBoundary === void 0 ? false : _options$altBoundary,\n _options$padding = _options.padding,\n padding = _options$padding === void 0 ? 0 : _options$padding;\n var paddingObject = mergePaddingObject(typeof padding !== 'number' ? padding : expandToHashMap(padding, basePlacements));\n var altContext = elementContext === popper ? reference : popper;\n var referenceElement = state.elements.reference;\n var popperRect = state.rects.popper;\n var element = state.elements[altBoundary ? altContext : elementContext];\n var clippingClientRect = getClippingRect(isElement(element) ? element : element.contextElement || getDocumentElement(state.elements.popper), boundary, rootBoundary);\n var referenceClientRect = getBoundingClientRect(referenceElement);\n var popperOffsets = computeOffsets({\n reference: referenceClientRect,\n element: popperRect,\n strategy: 'absolute',\n placement: placement\n });\n var popperClientRect = rectToClientRect(Object.assign({}, popperRect, popperOffsets));\n var elementClientRect = elementContext === popper ? popperClientRect : referenceClientRect; // positive = overflowing the clipping rect\n // 0 or negative = within the clipping rect\n\n var overflowOffsets = {\n top: clippingClientRect.top - elementClientRect.top + paddingObject.top,\n bottom: elementClientRect.bottom - clippingClientRect.bottom + paddingObject.bottom,\n left: clippingClientRect.left - elementClientRect.left + paddingObject.left,\n right: elementClientRect.right - clippingClientRect.right + paddingObject.right\n };\n var offsetData = state.modifiersData.offset; // Offsets can be applied only to the popper element\n\n if (elementContext === popper && offsetData) {\n var offset = offsetData[placement];\n Object.keys(overflowOffsets).forEach(function (key) {\n var multiply = [right, bottom].indexOf(key) >= 0 ? 1 : -1;\n var axis = [top, bottom].indexOf(key) >= 0 ? 'y' : 'x';\n overflowOffsets[key] += offset[axis] * multiply;\n });\n }\n\n return overflowOffsets;\n}","import getVariation from \"./getVariation.js\";\nimport { variationPlacements, basePlacements, placements as allPlacements } from \"../enums.js\";\nimport detectOverflow from \"./detectOverflow.js\";\nimport getBasePlacement from \"./getBasePlacement.js\";\nexport default function computeAutoPlacement(state, options) {\n if (options === void 0) {\n options = {};\n }\n\n var _options = options,\n placement = _options.placement,\n boundary = _options.boundary,\n rootBoundary = _options.rootBoundary,\n padding = _options.padding,\n flipVariations = _options.flipVariations,\n _options$allowedAutoP = _options.allowedAutoPlacements,\n allowedAutoPlacements = _options$allowedAutoP === void 0 ? allPlacements : _options$allowedAutoP;\n var variation = getVariation(placement);\n var placements = variation ? flipVariations ? variationPlacements : variationPlacements.filter(function (placement) {\n return getVariation(placement) === variation;\n }) : basePlacements;\n var allowedPlacements = placements.filter(function (placement) {\n return allowedAutoPlacements.indexOf(placement) >= 0;\n });\n\n if (allowedPlacements.length === 0) {\n allowedPlacements = placements;\n\n if (process.env.NODE_ENV !== \"production\") {\n console.error(['Popper: The `allowedAutoPlacements` option did not allow any', 'placements. Ensure the `placement` option matches the variation', 'of the allowed placements.', 'For example, \"auto\" cannot be used to allow \"bottom-start\".', 'Use \"auto-start\" instead.'].join(' '));\n }\n } // $FlowFixMe[incompatible-type]: Flow seems to have problems with two array unions...\n\n\n var overflows = allowedPlacements.reduce(function (acc, placement) {\n acc[placement] = detectOverflow(state, {\n placement: placement,\n boundary: boundary,\n rootBoundary: rootBoundary,\n padding: padding\n })[getBasePlacement(placement)];\n return acc;\n }, {});\n return Object.keys(overflows).sort(function (a, b) {\n return overflows[a] - overflows[b];\n });\n}","import getOppositePlacement from \"../utils/getOppositePlacement.js\";\nimport getBasePlacement from \"../utils/getBasePlacement.js\";\nimport getOppositeVariationPlacement from \"../utils/getOppositeVariationPlacement.js\";\nimport detectOverflow from \"../utils/detectOverflow.js\";\nimport computeAutoPlacement from \"../utils/computeAutoPlacement.js\";\nimport { bottom, top, start, right, left, auto } from \"../enums.js\";\nimport getVariation from \"../utils/getVariation.js\"; // eslint-disable-next-line import/no-unused-modules\n\nfunction getExpandedFallbackPlacements(placement) {\n if (getBasePlacement(placement) === auto) {\n return [];\n }\n\n var oppositePlacement = getOppositePlacement(placement);\n return [getOppositeVariationPlacement(placement), oppositePlacement, getOppositeVariationPlacement(oppositePlacement)];\n}\n\nfunction flip(_ref) {\n var state = _ref.state,\n options = _ref.options,\n name = _ref.name;\n\n if (state.modifiersData[name]._skip) {\n return;\n }\n\n var _options$mainAxis = options.mainAxis,\n checkMainAxis = _options$mainAxis === void 0 ? true : _options$mainAxis,\n _options$altAxis = options.altAxis,\n checkAltAxis = _options$altAxis === void 0 ? true : _options$altAxis,\n specifiedFallbackPlacements = options.fallbackPlacements,\n padding = options.padding,\n boundary = options.boundary,\n rootBoundary = options.rootBoundary,\n altBoundary = options.altBoundary,\n _options$flipVariatio = options.flipVariations,\n flipVariations = _options$flipVariatio === void 0 ? true : _options$flipVariatio,\n allowedAutoPlacements = options.allowedAutoPlacements;\n var preferredPlacement = state.options.placement;\n var basePlacement = getBasePlacement(preferredPlacement);\n var isBasePlacement = basePlacement === preferredPlacement;\n var fallbackPlacements = specifiedFallbackPlacements || (isBasePlacement || !flipVariations ? [getOppositePlacement(preferredPlacement)] : getExpandedFallbackPlacements(preferredPlacement));\n var placements = [preferredPlacement].concat(fallbackPlacements).reduce(function (acc, placement) {\n return acc.concat(getBasePlacement(placement) === auto ? computeAutoPlacement(state, {\n placement: placement,\n boundary: boundary,\n rootBoundary: rootBoundary,\n padding: padding,\n flipVariations: flipVariations,\n allowedAutoPlacements: allowedAutoPlacements\n }) : placement);\n }, []);\n var referenceRect = state.rects.reference;\n var popperRect = state.rects.popper;\n var checksMap = new Map();\n var makeFallbackChecks = true;\n var firstFittingPlacement = placements[0];\n\n for (var i = 0; i < placements.length; i++) {\n var placement = placements[i];\n\n var _basePlacement = getBasePlacement(placement);\n\n var isStartVariation = getVariation(placement) === start;\n var isVertical = [top, bottom].indexOf(_basePlacement) >= 0;\n var len = isVertical ? 'width' : 'height';\n var overflow = detectOverflow(state, {\n placement: placement,\n boundary: boundary,\n rootBoundary: rootBoundary,\n altBoundary: altBoundary,\n padding: padding\n });\n var mainVariationSide = isVertical ? isStartVariation ? right : left : isStartVariation ? bottom : top;\n\n if (referenceRect[len] > popperRect[len]) {\n mainVariationSide = getOppositePlacement(mainVariationSide);\n }\n\n var altVariationSide = getOppositePlacement(mainVariationSide);\n var checks = [];\n\n if (checkMainAxis) {\n checks.push(overflow[_basePlacement] <= 0);\n }\n\n if (checkAltAxis) {\n checks.push(overflow[mainVariationSide] <= 0, overflow[altVariationSide] <= 0);\n }\n\n if (checks.every(function (check) {\n return check;\n })) {\n firstFittingPlacement = placement;\n makeFallbackChecks = false;\n break;\n }\n\n checksMap.set(placement, checks);\n }\n\n if (makeFallbackChecks) {\n // `2` may be desired in some cases – research later\n var numberOfChecks = flipVariations ? 3 : 1;\n\n var _loop = function _loop(_i) {\n var fittingPlacement = placements.find(function (placement) {\n var checks = checksMap.get(placement);\n\n if (checks) {\n return checks.slice(0, _i).every(function (check) {\n return check;\n });\n }\n });\n\n if (fittingPlacement) {\n firstFittingPlacement = fittingPlacement;\n return \"break\";\n }\n };\n\n for (var _i = numberOfChecks; _i > 0; _i--) {\n var _ret = _loop(_i);\n\n if (_ret === \"break\") break;\n }\n }\n\n if (state.placement !== firstFittingPlacement) {\n state.modifiersData[name]._skip = true;\n state.placement = firstFittingPlacement;\n state.reset = true;\n }\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'flip',\n enabled: true,\n phase: 'main',\n fn: flip,\n requiresIfExists: ['offset'],\n data: {\n _skip: false\n }\n};","import { top, bottom, left, right } from \"../enums.js\";\nimport detectOverflow from \"../utils/detectOverflow.js\";\n\nfunction getSideOffsets(overflow, rect, preventedOffsets) {\n if (preventedOffsets === void 0) {\n preventedOffsets = {\n x: 0,\n y: 0\n };\n }\n\n return {\n top: overflow.top - rect.height - preventedOffsets.y,\n right: overflow.right - rect.width + preventedOffsets.x,\n bottom: overflow.bottom - rect.height + preventedOffsets.y,\n left: overflow.left - rect.width - preventedOffsets.x\n };\n}\n\nfunction isAnySideFullyClipped(overflow) {\n return [top, right, bottom, left].some(function (side) {\n return overflow[side] >= 0;\n });\n}\n\nfunction hide(_ref) {\n var state = _ref.state,\n name = _ref.name;\n var referenceRect = state.rects.reference;\n var popperRect = state.rects.popper;\n var preventedOffsets = state.modifiersData.preventOverflow;\n var referenceOverflow = detectOverflow(state, {\n elementContext: 'reference'\n });\n var popperAltOverflow = detectOverflow(state, {\n altBoundary: true\n });\n var referenceClippingOffsets = getSideOffsets(referenceOverflow, referenceRect);\n var popperEscapeOffsets = getSideOffsets(popperAltOverflow, popperRect, preventedOffsets);\n var isReferenceHidden = isAnySideFullyClipped(referenceClippingOffsets);\n var hasPopperEscaped = isAnySideFullyClipped(popperEscapeOffsets);\n state.modifiersData[name] = {\n referenceClippingOffsets: referenceClippingOffsets,\n popperEscapeOffsets: popperEscapeOffsets,\n isReferenceHidden: isReferenceHidden,\n hasPopperEscaped: hasPopperEscaped\n };\n state.attributes.popper = Object.assign({}, state.attributes.popper, {\n 'data-popper-reference-hidden': isReferenceHidden,\n 'data-popper-escaped': hasPopperEscaped\n });\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'hide',\n enabled: true,\n phase: 'main',\n requiresIfExists: ['preventOverflow'],\n fn: hide\n};","import getBasePlacement from \"../utils/getBasePlacement.js\";\nimport { top, left, right, placements } from \"../enums.js\";\nexport function distanceAndSkiddingToXY(placement, rects, offset) {\n var basePlacement = getBasePlacement(placement);\n var invertDistance = [left, top].indexOf(basePlacement) >= 0 ? -1 : 1;\n\n var _ref = typeof offset === 'function' ? offset(Object.assign({}, rects, {\n placement: placement\n })) : offset,\n skidding = _ref[0],\n distance = _ref[1];\n\n skidding = skidding || 0;\n distance = (distance || 0) * invertDistance;\n return [left, right].indexOf(basePlacement) >= 0 ? {\n x: distance,\n y: skidding\n } : {\n x: skidding,\n y: distance\n };\n}\n\nfunction offset(_ref2) {\n var state = _ref2.state,\n options = _ref2.options,\n name = _ref2.name;\n var _options$offset = options.offset,\n offset = _options$offset === void 0 ? [0, 0] : _options$offset;\n var data = placements.reduce(function (acc, placement) {\n acc[placement] = distanceAndSkiddingToXY(placement, state.rects, offset);\n return acc;\n }, {});\n var _data$state$placement = data[state.placement],\n x = _data$state$placement.x,\n y = _data$state$placement.y;\n\n if (state.modifiersData.popperOffsets != null) {\n state.modifiersData.popperOffsets.x += x;\n state.modifiersData.popperOffsets.y += y;\n }\n\n state.modifiersData[name] = data;\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'offset',\n enabled: true,\n phase: 'main',\n requires: ['popperOffsets'],\n fn: offset\n};","import computeOffsets from \"../utils/computeOffsets.js\";\n\nfunction popperOffsets(_ref) {\n var state = _ref.state,\n name = _ref.name;\n // Offsets are the actual position the popper needs to have to be\n // properly positioned near its reference element\n // This is the most basic placement, and will be adjusted by\n // the modifiers in the next step\n state.modifiersData[name] = computeOffsets({\n reference: state.rects.reference,\n element: state.rects.popper,\n strategy: 'absolute',\n placement: state.placement\n });\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'popperOffsets',\n enabled: true,\n phase: 'read',\n fn: popperOffsets,\n data: {}\n};","import { top, left, right, bottom, start } from \"../enums.js\";\nimport getBasePlacement from \"../utils/getBasePlacement.js\";\nimport getMainAxisFromPlacement from \"../utils/getMainAxisFromPlacement.js\";\nimport getAltAxis from \"../utils/getAltAxis.js\";\nimport within from \"../utils/within.js\";\nimport getLayoutRect from \"../dom-utils/getLayoutRect.js\";\nimport getOffsetParent from \"../dom-utils/getOffsetParent.js\";\nimport detectOverflow from \"../utils/detectOverflow.js\";\nimport getVariation from \"../utils/getVariation.js\";\nimport getFreshSideObject from \"../utils/getFreshSideObject.js\";\nimport { max as mathMax, min as mathMin } from \"../utils/math.js\";\n\nfunction preventOverflow(_ref) {\n var state = _ref.state,\n options = _ref.options,\n name = _ref.name;\n var _options$mainAxis = options.mainAxis,\n checkMainAxis = _options$mainAxis === void 0 ? true : _options$mainAxis,\n _options$altAxis = options.altAxis,\n checkAltAxis = _options$altAxis === void 0 ? false : _options$altAxis,\n boundary = options.boundary,\n rootBoundary = options.rootBoundary,\n altBoundary = options.altBoundary,\n padding = options.padding,\n _options$tether = options.tether,\n tether = _options$tether === void 0 ? true : _options$tether,\n _options$tetherOffset = options.tetherOffset,\n tetherOffset = _options$tetherOffset === void 0 ? 0 : _options$tetherOffset;\n var overflow = detectOverflow(state, {\n boundary: boundary,\n rootBoundary: rootBoundary,\n padding: padding,\n altBoundary: altBoundary\n });\n var basePlacement = getBasePlacement(state.placement);\n var variation = getVariation(state.placement);\n var isBasePlacement = !variation;\n var mainAxis = getMainAxisFromPlacement(basePlacement);\n var altAxis = getAltAxis(mainAxis);\n var popperOffsets = state.modifiersData.popperOffsets;\n var referenceRect = state.rects.reference;\n var popperRect = state.rects.popper;\n var tetherOffsetValue = typeof tetherOffset === 'function' ? tetherOffset(Object.assign({}, state.rects, {\n placement: state.placement\n })) : tetherOffset;\n var data = {\n x: 0,\n y: 0\n };\n\n if (!popperOffsets) {\n return;\n }\n\n if (checkMainAxis || checkAltAxis) {\n var mainSide = mainAxis === 'y' ? top : left;\n var altSide = mainAxis === 'y' ? bottom : right;\n var len = mainAxis === 'y' ? 'height' : 'width';\n var offset = popperOffsets[mainAxis];\n var min = popperOffsets[mainAxis] + overflow[mainSide];\n var max = popperOffsets[mainAxis] - overflow[altSide];\n var additive = tether ? -popperRect[len] / 2 : 0;\n var minLen = variation === start ? referenceRect[len] : popperRect[len];\n var maxLen = variation === start ? -popperRect[len] : -referenceRect[len]; // We need to include the arrow in the calculation so the arrow doesn't go\n // outside the reference bounds\n\n var arrowElement = state.elements.arrow;\n var arrowRect = tether && arrowElement ? getLayoutRect(arrowElement) : {\n width: 0,\n height: 0\n };\n var arrowPaddingObject = state.modifiersData['arrow#persistent'] ? state.modifiersData['arrow#persistent'].padding : getFreshSideObject();\n var arrowPaddingMin = arrowPaddingObject[mainSide];\n var arrowPaddingMax = arrowPaddingObject[altSide]; // If the reference length is smaller than the arrow length, we don't want\n // to include its full size in the calculation. If the reference is small\n // and near the edge of a boundary, the popper can overflow even if the\n // reference is not overflowing as well (e.g. virtual elements with no\n // width or height)\n\n var arrowLen = within(0, referenceRect[len], arrowRect[len]);\n var minOffset = isBasePlacement ? referenceRect[len] / 2 - additive - arrowLen - arrowPaddingMin - tetherOffsetValue : minLen - arrowLen - arrowPaddingMin - tetherOffsetValue;\n var maxOffset = isBasePlacement ? -referenceRect[len] / 2 + additive + arrowLen + arrowPaddingMax + tetherOffsetValue : maxLen + arrowLen + arrowPaddingMax + tetherOffsetValue;\n var arrowOffsetParent = state.elements.arrow && getOffsetParent(state.elements.arrow);\n var clientOffset = arrowOffsetParent ? mainAxis === 'y' ? arrowOffsetParent.clientTop || 0 : arrowOffsetParent.clientLeft || 0 : 0;\n var offsetModifierValue = state.modifiersData.offset ? state.modifiersData.offset[state.placement][mainAxis] : 0;\n var tetherMin = popperOffsets[mainAxis] + minOffset - offsetModifierValue - clientOffset;\n var tetherMax = popperOffsets[mainAxis] + maxOffset - offsetModifierValue;\n\n if (checkMainAxis) {\n var preventedOffset = within(tether ? mathMin(min, tetherMin) : min, offset, tether ? mathMax(max, tetherMax) : max);\n popperOffsets[mainAxis] = preventedOffset;\n data[mainAxis] = preventedOffset - offset;\n }\n\n if (checkAltAxis) {\n var _mainSide = mainAxis === 'x' ? top : left;\n\n var _altSide = mainAxis === 'x' ? bottom : right;\n\n var _offset = popperOffsets[altAxis];\n\n var _min = _offset + overflow[_mainSide];\n\n var _max = _offset - overflow[_altSide];\n\n var _preventedOffset = within(tether ? mathMin(_min, tetherMin) : _min, _offset, tether ? mathMax(_max, tetherMax) : _max);\n\n popperOffsets[altAxis] = _preventedOffset;\n data[altAxis] = _preventedOffset - _offset;\n }\n }\n\n state.modifiersData[name] = data;\n} // eslint-disable-next-line import/no-unused-modules\n\n\nexport default {\n name: 'preventOverflow',\n enabled: true,\n phase: 'main',\n fn: preventOverflow,\n requiresIfExists: ['offset']\n};","export default function getAltAxis(axis) {\n return axis === 'x' ? 'y' : 'x';\n}","import getBoundingClientRect from \"./getBoundingClientRect.js\";\nimport getNodeScroll from \"./getNodeScroll.js\";\nimport getNodeName from \"./getNodeName.js\";\nimport { isHTMLElement } from \"./instanceOf.js\";\nimport getWindowScrollBarX from \"./getWindowScrollBarX.js\";\nimport getDocumentElement from \"./getDocumentElement.js\";\nimport isScrollParent from \"./isScrollParent.js\";\n\nfunction isElementScaled(element) {\n var rect = element.getBoundingClientRect();\n var scaleX = rect.width / element.offsetWidth || 1;\n var scaleY = rect.height / element.offsetHeight || 1;\n return scaleX !== 1 || scaleY !== 1;\n} // Returns the composite rect of an element relative to its offsetParent.\n// Composite means it takes into account transforms as well as layout.\n\n\nexport default function getCompositeRect(elementOrVirtualElement, offsetParent, isFixed) {\n if (isFixed === void 0) {\n isFixed = false;\n }\n\n var isOffsetParentAnElement = isHTMLElement(offsetParent);\n var offsetParentIsScaled = isHTMLElement(offsetParent) && isElementScaled(offsetParent);\n var documentElement = getDocumentElement(offsetParent);\n var rect = getBoundingClientRect(elementOrVirtualElement, offsetParentIsScaled);\n var scroll = {\n scrollLeft: 0,\n scrollTop: 0\n };\n var offsets = {\n x: 0,\n y: 0\n };\n\n if (isOffsetParentAnElement || !isOffsetParentAnElement && !isFixed) {\n if (getNodeName(offsetParent) !== 'body' || // https://github.com/popperjs/popper-core/issues/1078\n isScrollParent(documentElement)) {\n scroll = getNodeScroll(offsetParent);\n }\n\n if (isHTMLElement(offsetParent)) {\n offsets = getBoundingClientRect(offsetParent, true);\n offsets.x += offsetParent.clientLeft;\n offsets.y += offsetParent.clientTop;\n } else if (documentElement) {\n offsets.x = getWindowScrollBarX(documentElement);\n }\n }\n\n return {\n x: rect.left + scroll.scrollLeft - offsets.x,\n y: rect.top + scroll.scrollTop - offsets.y,\n width: rect.width,\n height: rect.height\n };\n}","import getWindowScroll from \"./getWindowScroll.js\";\nimport getWindow from \"./getWindow.js\";\nimport { isHTMLElement } from \"./instanceOf.js\";\nimport getHTMLElementScroll from \"./getHTMLElementScroll.js\";\nexport default function getNodeScroll(node) {\n if (node === getWindow(node) || !isHTMLElement(node)) {\n return getWindowScroll(node);\n } else {\n return getHTMLElementScroll(node);\n }\n}","export default function getHTMLElementScroll(element) {\n return {\n scrollLeft: element.scrollLeft,\n scrollTop: element.scrollTop\n };\n}","import getCompositeRect from \"./dom-utils/getCompositeRect.js\";\nimport getLayoutRect from \"./dom-utils/getLayoutRect.js\";\nimport listScrollParents from \"./dom-utils/listScrollParents.js\";\nimport getOffsetParent from \"./dom-utils/getOffsetParent.js\";\nimport getComputedStyle from \"./dom-utils/getComputedStyle.js\";\nimport orderModifiers from \"./utils/orderModifiers.js\";\nimport debounce from \"./utils/debounce.js\";\nimport validateModifiers from \"./utils/validateModifiers.js\";\nimport uniqueBy from \"./utils/uniqueBy.js\";\nimport getBasePlacement from \"./utils/getBasePlacement.js\";\nimport mergeByName from \"./utils/mergeByName.js\";\nimport detectOverflow from \"./utils/detectOverflow.js\";\nimport { isElement } from \"./dom-utils/instanceOf.js\";\nimport { auto } from \"./enums.js\";\nvar INVALID_ELEMENT_ERROR = 'Popper: Invalid reference or popper argument provided. They must be either a DOM element or virtual element.';\nvar INFINITE_LOOP_ERROR = 'Popper: An infinite loop in the modifiers cycle has been detected! The cycle has been interrupted to prevent a browser crash.';\nvar DEFAULT_OPTIONS = {\n placement: 'bottom',\n modifiers: [],\n strategy: 'absolute'\n};\n\nfunction areValidElements() {\n for (var _len = arguments.length, args = new Array(_len), _key = 0; _key < _len; _key++) {\n args[_key] = arguments[_key];\n }\n\n return !args.some(function (element) {\n return !(element && typeof element.getBoundingClientRect === 'function');\n });\n}\n\nexport function popperGenerator(generatorOptions) {\n if (generatorOptions === void 0) {\n generatorOptions = {};\n }\n\n var _generatorOptions = generatorOptions,\n _generatorOptions$def = _generatorOptions.defaultModifiers,\n defaultModifiers = _generatorOptions$def === void 0 ? [] : _generatorOptions$def,\n _generatorOptions$def2 = _generatorOptions.defaultOptions,\n defaultOptions = _generatorOptions$def2 === void 0 ? DEFAULT_OPTIONS : _generatorOptions$def2;\n return function createPopper(reference, popper, options) {\n if (options === void 0) {\n options = defaultOptions;\n }\n\n var state = {\n placement: 'bottom',\n orderedModifiers: [],\n options: Object.assign({}, DEFAULT_OPTIONS, defaultOptions),\n modifiersData: {},\n elements: {\n reference: reference,\n popper: popper\n },\n attributes: {},\n styles: {}\n };\n var effectCleanupFns = [];\n var isDestroyed = false;\n var instance = {\n state: state,\n setOptions: function setOptions(options) {\n cleanupModifierEffects();\n state.options = Object.assign({}, defaultOptions, state.options, options);\n state.scrollParents = {\n reference: isElement(reference) ? listScrollParents(reference) : reference.contextElement ? listScrollParents(reference.contextElement) : [],\n popper: listScrollParents(popper)\n }; // Orders the modifiers based on their dependencies and `phase`\n // properties\n\n var orderedModifiers = orderModifiers(mergeByName([].concat(defaultModifiers, state.options.modifiers))); // Strip out disabled modifiers\n\n state.orderedModifiers = orderedModifiers.filter(function (m) {\n return m.enabled;\n }); // Validate the provided modifiers so that the consumer will get warned\n // if one of the modifiers is invalid for any reason\n\n if (process.env.NODE_ENV !== \"production\") {\n var modifiers = uniqueBy([].concat(orderedModifiers, state.options.modifiers), function (_ref) {\n var name = _ref.name;\n return name;\n });\n validateModifiers(modifiers);\n\n if (getBasePlacement(state.options.placement) === auto) {\n var flipModifier = state.orderedModifiers.find(function (_ref2) {\n var name = _ref2.name;\n return name === 'flip';\n });\n\n if (!flipModifier) {\n console.error(['Popper: \"auto\" placements require the \"flip\" modifier be', 'present and enabled to work.'].join(' '));\n }\n }\n\n var _getComputedStyle = getComputedStyle(popper),\n marginTop = _getComputedStyle.marginTop,\n marginRight = _getComputedStyle.marginRight,\n marginBottom = _getComputedStyle.marginBottom,\n marginLeft = _getComputedStyle.marginLeft; // We no longer take into account `margins` on the popper, and it can\n // cause bugs with positioning, so we'll warn the consumer\n\n\n if ([marginTop, marginRight, marginBottom, marginLeft].some(function (margin) {\n return parseFloat(margin);\n })) {\n console.warn(['Popper: CSS \"margin\" styles cannot be used to apply padding', 'between the popper and its reference element or boundary.', 'To replicate margin, use the `offset` modifier, as well as', 'the `padding` option in the `preventOverflow` and `flip`', 'modifiers.'].join(' '));\n }\n }\n\n runModifierEffects();\n return instance.update();\n },\n // Sync update – it will always be executed, even if not necessary. This\n // is useful for low frequency updates where sync behavior simplifies the\n // logic.\n // For high frequency updates (e.g. `resize` and `scroll` events), always\n // prefer the async Popper#update method\n forceUpdate: function forceUpdate() {\n if (isDestroyed) {\n return;\n }\n\n var _state$elements = state.elements,\n reference = _state$elements.reference,\n popper = _state$elements.popper; // Don't proceed if `reference` or `popper` are not valid elements\n // anymore\n\n if (!areValidElements(reference, popper)) {\n if (process.env.NODE_ENV !== \"production\") {\n console.error(INVALID_ELEMENT_ERROR);\n }\n\n return;\n } // Store the reference and popper rects to be read by modifiers\n\n\n state.rects = {\n reference: getCompositeRect(reference, getOffsetParent(popper), state.options.strategy === 'fixed'),\n popper: getLayoutRect(popper)\n }; // Modifiers have the ability to reset the current update cycle. The\n // most common use case for this is the `flip` modifier changing the\n // placement, which then needs to re-run all the modifiers, because the\n // logic was previously ran for the previous placement and is therefore\n // stale/incorrect\n\n state.reset = false;\n state.placement = state.options.placement; // On each update cycle, the `modifiersData` property for each modifier\n // is filled with the initial data specified by the modifier. This means\n // it doesn't persist and is fresh on each update.\n // To ensure persistent data, use `${name}#persistent`\n\n state.orderedModifiers.forEach(function (modifier) {\n return state.modifiersData[modifier.name] = Object.assign({}, modifier.data);\n });\n var __debug_loops__ = 0;\n\n for (var index = 0; index < state.orderedModifiers.length; index++) {\n if (process.env.NODE_ENV !== \"production\") {\n __debug_loops__ += 1;\n\n if (__debug_loops__ > 100) {\n console.error(INFINITE_LOOP_ERROR);\n break;\n }\n }\n\n if (state.reset === true) {\n state.reset = false;\n index = -1;\n continue;\n }\n\n var _state$orderedModifie = state.orderedModifiers[index],\n fn = _state$orderedModifie.fn,\n _state$orderedModifie2 = _state$orderedModifie.options,\n _options = _state$orderedModifie2 === void 0 ? {} : _state$orderedModifie2,\n name = _state$orderedModifie.name;\n\n if (typeof fn === 'function') {\n state = fn({\n state: state,\n options: _options,\n name: name,\n instance: instance\n }) || state;\n }\n }\n },\n // Async and optimistically optimized update – it will not be executed if\n // not necessary (debounced to run at most once-per-tick)\n update: debounce(function () {\n return new Promise(function (resolve) {\n instance.forceUpdate();\n resolve(state);\n });\n }),\n destroy: function destroy() {\n cleanupModifierEffects();\n isDestroyed = true;\n }\n };\n\n if (!areValidElements(reference, popper)) {\n if (process.env.NODE_ENV !== \"production\") {\n console.error(INVALID_ELEMENT_ERROR);\n }\n\n return instance;\n }\n\n instance.setOptions(options).then(function (state) {\n if (!isDestroyed && options.onFirstUpdate) {\n options.onFirstUpdate(state);\n }\n }); // Modifiers have the ability to execute arbitrary code before the first\n // update cycle runs. They will be executed in the same order as the update\n // cycle. This is useful when a modifier adds some persistent data that\n // other modifiers need to use, but the modifier is run after the dependent\n // one.\n\n function runModifierEffects() {\n state.orderedModifiers.forEach(function (_ref3) {\n var name = _ref3.name,\n _ref3$options = _ref3.options,\n options = _ref3$options === void 0 ? {} : _ref3$options,\n effect = _ref3.effect;\n\n if (typeof effect === 'function') {\n var cleanupFn = effect({\n state: state,\n name: name,\n instance: instance,\n options: options\n });\n\n var noopFn = function noopFn() {};\n\n effectCleanupFns.push(cleanupFn || noopFn);\n }\n });\n }\n\n function cleanupModifierEffects() {\n effectCleanupFns.forEach(function (fn) {\n return fn();\n });\n effectCleanupFns = [];\n }\n\n return instance;\n };\n}\nexport var createPopper = /*#__PURE__*/popperGenerator(); // eslint-disable-next-line import/no-unused-modules\n\nexport { detectOverflow };","export default function debounce(fn) {\n var pending;\n return function () {\n if (!pending) {\n pending = new Promise(function (resolve) {\n Promise.resolve().then(function () {\n pending = undefined;\n resolve(fn());\n });\n });\n }\n\n return pending;\n };\n}","export default function mergeByName(modifiers) {\n var merged = modifiers.reduce(function (merged, current) {\n var existing = merged[current.name];\n merged[current.name] = existing ? Object.assign({}, existing, current, {\n options: Object.assign({}, existing.options, current.options),\n data: Object.assign({}, existing.data, current.data)\n }) : current;\n return merged;\n }, {}); // IE11 does not support Object.values\n\n return Object.keys(merged).map(function (key) {\n return merged[key];\n });\n}","import { modifierPhases } from \"../enums.js\"; // source: https://stackoverflow.com/questions/49875255\n\nfunction order(modifiers) {\n var map = new Map();\n var visited = new Set();\n var result = [];\n modifiers.forEach(function (modifier) {\n map.set(modifier.name, modifier);\n }); // On visiting object, check for its dependencies and visit them recursively\n\n function sort(modifier) {\n visited.add(modifier.name);\n var requires = [].concat(modifier.requires || [], modifier.requiresIfExists || []);\n requires.forEach(function (dep) {\n if (!visited.has(dep)) {\n var depModifier = map.get(dep);\n\n if (depModifier) {\n sort(depModifier);\n }\n }\n });\n result.push(modifier);\n }\n\n modifiers.forEach(function (modifier) {\n if (!visited.has(modifier.name)) {\n // check for visited object\n sort(modifier);\n }\n });\n return result;\n}\n\nexport default function orderModifiers(modifiers) {\n // order based on dependencies\n var orderedModifiers = order(modifiers); // order based on phase\n\n return modifierPhases.reduce(function (acc, phase) {\n return acc.concat(orderedModifiers.filter(function (modifier) {\n return modifier.phase === phase;\n }));\n }, []);\n}","import { popperGenerator, detectOverflow } from \"./createPopper.js\";\nimport eventListeners from \"./modifiers/eventListeners.js\";\nimport popperOffsets from \"./modifiers/popperOffsets.js\";\nimport computeStyles from \"./modifiers/computeStyles.js\";\nimport applyStyles from \"./modifiers/applyStyles.js\";\nvar defaultModifiers = [eventListeners, popperOffsets, computeStyles, applyStyles];\nvar createPopper = /*#__PURE__*/popperGenerator({\n defaultModifiers: defaultModifiers\n}); // eslint-disable-next-line import/no-unused-modules\n\nexport { createPopper, popperGenerator, defaultModifiers, detectOverflow };","import { popperGenerator, detectOverflow } from \"./createPopper.js\";\nimport eventListeners from \"./modifiers/eventListeners.js\";\nimport popperOffsets from \"./modifiers/popperOffsets.js\";\nimport computeStyles from \"./modifiers/computeStyles.js\";\nimport applyStyles from \"./modifiers/applyStyles.js\";\nimport offset from \"./modifiers/offset.js\";\nimport flip from \"./modifiers/flip.js\";\nimport preventOverflow from \"./modifiers/preventOverflow.js\";\nimport arrow from \"./modifiers/arrow.js\";\nimport hide from \"./modifiers/hide.js\";\nvar defaultModifiers = [eventListeners, popperOffsets, computeStyles, applyStyles, offset, flip, preventOverflow, arrow, hide];\nvar createPopper = /*#__PURE__*/popperGenerator({\n defaultModifiers: defaultModifiers\n}); // eslint-disable-next-line import/no-unused-modules\n\nexport { createPopper, popperGenerator, defaultModifiers, detectOverflow }; // eslint-disable-next-line import/no-unused-modules\n\nexport { createPopper as createPopperLite } from \"./popper-lite.js\"; // eslint-disable-next-line import/no-unused-modules\n\nexport * from \"./modifiers/index.js\";","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): dropdown.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport * as Popper from '@popperjs/core'\n\nimport {\n defineJQueryPlugin,\n getElement,\n getElementFromSelector,\n getNextActiveElement,\n isDisabled,\n isElement,\n isRTL,\n isVisible,\n noop,\n typeCheckConfig\n} from './util/index'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'dropdown'\nconst DATA_KEY = 'bs.dropdown'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\n\nconst ESCAPE_KEY = 'Escape'\nconst SPACE_KEY = 'Space'\nconst TAB_KEY = 'Tab'\nconst ARROW_UP_KEY = 'ArrowUp'\nconst ARROW_DOWN_KEY = 'ArrowDown'\nconst RIGHT_MOUSE_BUTTON = 2 // MouseEvent.button value for the secondary button, usually the right button\n\nconst REGEXP_KEYDOWN = new RegExp(`${ARROW_UP_KEY}|${ARROW_DOWN_KEY}|${ESCAPE_KEY}`)\n\nconst EVENT_HIDE = `hide${EVENT_KEY}`\nconst EVENT_HIDDEN = `hidden${EVENT_KEY}`\nconst EVENT_SHOW = `show${EVENT_KEY}`\nconst EVENT_SHOWN = `shown${EVENT_KEY}`\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\nconst EVENT_KEYDOWN_DATA_API = `keydown${EVENT_KEY}${DATA_API_KEY}`\nconst EVENT_KEYUP_DATA_API = `keyup${EVENT_KEY}${DATA_API_KEY}`\n\nconst CLASS_NAME_SHOW = 'show'\nconst CLASS_NAME_DROPUP = 'dropup'\nconst CLASS_NAME_DROPEND = 'dropend'\nconst CLASS_NAME_DROPSTART = 'dropstart'\nconst CLASS_NAME_NAVBAR = 'navbar'\n\nconst SELECTOR_DATA_TOGGLE = '[data-bs-toggle=\"dropdown\"]'\nconst SELECTOR_MENU = '.dropdown-menu'\nconst SELECTOR_NAVBAR_NAV = '.navbar-nav'\nconst SELECTOR_VISIBLE_ITEMS = '.dropdown-menu .dropdown-item:not(.disabled):not(:disabled)'\n\nconst PLACEMENT_TOP = isRTL() ? 'top-end' : 'top-start'\nconst PLACEMENT_TOPEND = isRTL() ? 'top-start' : 'top-end'\nconst PLACEMENT_BOTTOM = isRTL() ? 'bottom-end' : 'bottom-start'\nconst PLACEMENT_BOTTOMEND = isRTL() ? 'bottom-start' : 'bottom-end'\nconst PLACEMENT_RIGHT = isRTL() ? 'left-start' : 'right-start'\nconst PLACEMENT_LEFT = isRTL() ? 'right-start' : 'left-start'\n\nconst Default = {\n offset: [0, 2],\n boundary: 'clippingParents',\n reference: 'toggle',\n display: 'dynamic',\n popperConfig: null,\n autoClose: true\n}\n\nconst DefaultType = {\n offset: '(array|string|function)',\n boundary: '(string|element)',\n reference: '(string|element|object)',\n display: 'string',\n popperConfig: '(null|object|function)',\n autoClose: '(boolean|string)'\n}\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Dropdown extends BaseComponent {\n constructor(element, config) {\n super(element)\n\n this._popper = null\n this._config = this._getConfig(config)\n this._menu = this._getMenuElement()\n this._inNavbar = this._detectNavbar()\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get DefaultType() {\n return DefaultType\n }\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n toggle() {\n return this._isShown() ? this.hide() : this.show()\n }\n\n show() {\n if (isDisabled(this._element) || this._isShown(this._menu)) {\n return\n }\n\n const relatedTarget = {\n relatedTarget: this._element\n }\n\n const showEvent = EventHandler.trigger(this._element, EVENT_SHOW, relatedTarget)\n\n if (showEvent.defaultPrevented) {\n return\n }\n\n const parent = Dropdown.getParentFromElement(this._element)\n // Totally disable Popper for Dropdowns in Navbar\n if (this._inNavbar) {\n Manipulator.setDataAttribute(this._menu, 'popper', 'none')\n } else {\n this._createPopper(parent)\n }\n\n // If this is a touch-enabled device we add extra\n // empty mouseover listeners to the body's immediate children;\n // only needed because of broken event delegation on iOS\n // https://www.quirksmode.org/blog/archives/2014/02/mouse_event_bub.html\n if ('ontouchstart' in document.documentElement &&\n !parent.closest(SELECTOR_NAVBAR_NAV)) {\n [].concat(...document.body.children)\n .forEach(elem => EventHandler.on(elem, 'mouseover', noop))\n }\n\n this._element.focus()\n this._element.setAttribute('aria-expanded', true)\n\n this._menu.classList.add(CLASS_NAME_SHOW)\n this._element.classList.add(CLASS_NAME_SHOW)\n EventHandler.trigger(this._element, EVENT_SHOWN, relatedTarget)\n }\n\n hide() {\n if (isDisabled(this._element) || !this._isShown(this._menu)) {\n return\n }\n\n const relatedTarget = {\n relatedTarget: this._element\n }\n\n this._completeHide(relatedTarget)\n }\n\n dispose() {\n if (this._popper) {\n this._popper.destroy()\n }\n\n super.dispose()\n }\n\n update() {\n this._inNavbar = this._detectNavbar()\n if (this._popper) {\n this._popper.update()\n }\n }\n\n // Private\n\n _completeHide(relatedTarget) {\n const hideEvent = EventHandler.trigger(this._element, EVENT_HIDE, relatedTarget)\n if (hideEvent.defaultPrevented) {\n return\n }\n\n // If this is a touch-enabled device we remove the extra\n // empty mouseover listeners we added for iOS support\n if ('ontouchstart' in document.documentElement) {\n [].concat(...document.body.children)\n .forEach(elem => EventHandler.off(elem, 'mouseover', noop))\n }\n\n if (this._popper) {\n this._popper.destroy()\n }\n\n this._menu.classList.remove(CLASS_NAME_SHOW)\n this._element.classList.remove(CLASS_NAME_SHOW)\n this._element.setAttribute('aria-expanded', 'false')\n Manipulator.removeDataAttribute(this._menu, 'popper')\n EventHandler.trigger(this._element, EVENT_HIDDEN, relatedTarget)\n }\n\n _getConfig(config) {\n config = {\n ...this.constructor.Default,\n ...Manipulator.getDataAttributes(this._element),\n ...config\n }\n\n typeCheckConfig(NAME, config, this.constructor.DefaultType)\n\n if (typeof config.reference === 'object' && !isElement(config.reference) &&\n typeof config.reference.getBoundingClientRect !== 'function'\n ) {\n // Popper virtual elements require a getBoundingClientRect method\n throw new TypeError(`${NAME.toUpperCase()}: Option \"reference\" provided type \"object\" without a required \"getBoundingClientRect\" method.`)\n }\n\n return config\n }\n\n _createPopper(parent) {\n if (typeof Popper === 'undefined') {\n throw new TypeError('Bootstrap\\'s dropdowns require Popper (https://popper.js.org)')\n }\n\n let referenceElement = this._element\n\n if (this._config.reference === 'parent') {\n referenceElement = parent\n } else if (isElement(this._config.reference)) {\n referenceElement = getElement(this._config.reference)\n } else if (typeof this._config.reference === 'object') {\n referenceElement = this._config.reference\n }\n\n const popperConfig = this._getPopperConfig()\n const isDisplayStatic = popperConfig.modifiers.find(modifier => modifier.name === 'applyStyles' && modifier.enabled === false)\n\n this._popper = Popper.createPopper(referenceElement, this._menu, popperConfig)\n\n if (isDisplayStatic) {\n Manipulator.setDataAttribute(this._menu, 'popper', 'static')\n }\n }\n\n _isShown(element = this._element) {\n return element.classList.contains(CLASS_NAME_SHOW)\n }\n\n _getMenuElement() {\n return SelectorEngine.next(this._element, SELECTOR_MENU)[0]\n }\n\n _getPlacement() {\n const parentDropdown = this._element.parentNode\n\n if (parentDropdown.classList.contains(CLASS_NAME_DROPEND)) {\n return PLACEMENT_RIGHT\n }\n\n if (parentDropdown.classList.contains(CLASS_NAME_DROPSTART)) {\n return PLACEMENT_LEFT\n }\n\n // We need to trim the value because custom properties can also include spaces\n const isEnd = getComputedStyle(this._menu).getPropertyValue('--bs-position').trim() === 'end'\n\n if (parentDropdown.classList.contains(CLASS_NAME_DROPUP)) {\n return isEnd ? PLACEMENT_TOPEND : PLACEMENT_TOP\n }\n\n return isEnd ? PLACEMENT_BOTTOMEND : PLACEMENT_BOTTOM\n }\n\n _detectNavbar() {\n return this._element.closest(`.${CLASS_NAME_NAVBAR}`) !== null\n }\n\n _getOffset() {\n const { offset } = this._config\n\n if (typeof offset === 'string') {\n return offset.split(',').map(val => Number.parseInt(val, 10))\n }\n\n if (typeof offset === 'function') {\n return popperData => offset(popperData, this._element)\n }\n\n return offset\n }\n\n _getPopperConfig() {\n const defaultBsPopperConfig = {\n placement: this._getPlacement(),\n modifiers: [{\n name: 'preventOverflow',\n options: {\n boundary: this._config.boundary\n }\n },\n {\n name: 'offset',\n options: {\n offset: this._getOffset()\n }\n }]\n }\n\n // Disable Popper if we have a static display\n if (this._config.display === 'static') {\n defaultBsPopperConfig.modifiers = [{\n name: 'applyStyles',\n enabled: false\n }]\n }\n\n return {\n ...defaultBsPopperConfig,\n ...(typeof this._config.popperConfig === 'function' ? this._config.popperConfig(defaultBsPopperConfig) : this._config.popperConfig)\n }\n }\n\n _selectMenuItem({ key, target }) {\n const items = SelectorEngine.find(SELECTOR_VISIBLE_ITEMS, this._menu).filter(isVisible)\n\n if (!items.length) {\n return\n }\n\n // if target isn't included in items (e.g. when expanding the dropdown)\n // allow cycling to get the last item in case key equals ARROW_UP_KEY\n getNextActiveElement(items, target, key === ARROW_DOWN_KEY, !items.includes(target)).focus()\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Dropdown.getOrCreateInstance(this, config)\n\n if (typeof config !== 'string') {\n return\n }\n\n if (typeof data[config] === 'undefined') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config]()\n })\n }\n\n static clearMenus(event) {\n if (event && (event.button === RIGHT_MOUSE_BUTTON || (event.type === 'keyup' && event.key !== TAB_KEY))) {\n return\n }\n\n const toggles = SelectorEngine.find(SELECTOR_DATA_TOGGLE)\n\n for (let i = 0, len = toggles.length; i < len; i++) {\n const context = Dropdown.getInstance(toggles[i])\n if (!context || context._config.autoClose === false) {\n continue\n }\n\n if (!context._isShown()) {\n continue\n }\n\n const relatedTarget = {\n relatedTarget: context._element\n }\n\n if (event) {\n const composedPath = event.composedPath()\n const isMenuTarget = composedPath.includes(context._menu)\n if (\n composedPath.includes(context._element) ||\n (context._config.autoClose === 'inside' && !isMenuTarget) ||\n (context._config.autoClose === 'outside' && isMenuTarget)\n ) {\n continue\n }\n\n // Tab navigation through the dropdown menu or events from contained inputs shouldn't close the menu\n if (context._menu.contains(event.target) && ((event.type === 'keyup' && event.key === TAB_KEY) || /input|select|option|textarea|form/i.test(event.target.tagName))) {\n continue\n }\n\n if (event.type === 'click') {\n relatedTarget.clickEvent = event\n }\n }\n\n context._completeHide(relatedTarget)\n }\n }\n\n static getParentFromElement(element) {\n return getElementFromSelector(element) || element.parentNode\n }\n\n static dataApiKeydownHandler(event) {\n // If not input/textarea:\n // - And not a key in REGEXP_KEYDOWN => not a dropdown command\n // If input/textarea:\n // - If space key => not a dropdown command\n // - If key is other than escape\n // - If key is not up or down => not a dropdown command\n // - If trigger inside the menu => not a dropdown command\n if (/input|textarea/i.test(event.target.tagName) ?\n event.key === SPACE_KEY || (event.key !== ESCAPE_KEY &&\n ((event.key !== ARROW_DOWN_KEY && event.key !== ARROW_UP_KEY) ||\n event.target.closest(SELECTOR_MENU))) :\n !REGEXP_KEYDOWN.test(event.key)) {\n return\n }\n\n const isActive = this.classList.contains(CLASS_NAME_SHOW)\n\n if (!isActive && event.key === ESCAPE_KEY) {\n return\n }\n\n event.preventDefault()\n event.stopPropagation()\n\n if (isDisabled(this)) {\n return\n }\n\n const getToggleButton = this.matches(SELECTOR_DATA_TOGGLE) ? this : SelectorEngine.prev(this, SELECTOR_DATA_TOGGLE)[0]\n const instance = Dropdown.getOrCreateInstance(getToggleButton)\n\n if (event.key === ESCAPE_KEY) {\n instance.hide()\n return\n }\n\n if (event.key === ARROW_UP_KEY || event.key === ARROW_DOWN_KEY) {\n if (!isActive) {\n instance.show()\n }\n\n instance._selectMenuItem(event)\n return\n }\n\n if (!isActive || event.key === SPACE_KEY) {\n Dropdown.clearMenus()\n }\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_KEYDOWN_DATA_API, SELECTOR_DATA_TOGGLE, Dropdown.dataApiKeydownHandler)\nEventHandler.on(document, EVENT_KEYDOWN_DATA_API, SELECTOR_MENU, Dropdown.dataApiKeydownHandler)\nEventHandler.on(document, EVENT_CLICK_DATA_API, Dropdown.clearMenus)\nEventHandler.on(document, EVENT_KEYUP_DATA_API, Dropdown.clearMenus)\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_TOGGLE, function (event) {\n event.preventDefault()\n Dropdown.getOrCreateInstance(this).toggle()\n})\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Dropdown to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Dropdown)\n\nexport default Dropdown\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/scrollBar.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport SelectorEngine from '../dom/selector-engine'\nimport Manipulator from '../dom/manipulator'\nimport { isElement } from './index'\n\nconst SELECTOR_FIXED_CONTENT = '.fixed-top, .fixed-bottom, .is-fixed, .sticky-top'\nconst SELECTOR_STICKY_CONTENT = '.sticky-top'\n\nclass ScrollBarHelper {\n constructor() {\n this._element = document.body\n }\n\n getWidth() {\n // https://developer.mozilla.org/en-US/docs/Web/API/Window/innerWidth#usage_notes\n const documentWidth = document.documentElement.clientWidth\n return Math.abs(window.innerWidth - documentWidth)\n }\n\n hide() {\n const width = this.getWidth()\n this._disableOverFlow()\n // give padding to element to balance the hidden scrollbar width\n this._setElementAttributes(this._element, 'paddingRight', calculatedValue => calculatedValue + width)\n // trick: We adjust positive paddingRight and negative marginRight to sticky-top elements to keep showing fullwidth\n this._setElementAttributes(SELECTOR_FIXED_CONTENT, 'paddingRight', calculatedValue => calculatedValue + width)\n this._setElementAttributes(SELECTOR_STICKY_CONTENT, 'marginRight', calculatedValue => calculatedValue - width)\n }\n\n _disableOverFlow() {\n this._saveInitialAttribute(this._element, 'overflow')\n this._element.style.overflow = 'hidden'\n }\n\n _setElementAttributes(selector, styleProp, callback) {\n const scrollbarWidth = this.getWidth()\n const manipulationCallBack = element => {\n if (element !== this._element && window.innerWidth > element.clientWidth + scrollbarWidth) {\n return\n }\n\n this._saveInitialAttribute(element, styleProp)\n const calculatedValue = window.getComputedStyle(element)[styleProp]\n element.style[styleProp] = `${callback(Number.parseFloat(calculatedValue))}px`\n }\n\n this._applyManipulationCallback(selector, manipulationCallBack)\n }\n\n reset() {\n this._resetElementAttributes(this._element, 'overflow')\n this._resetElementAttributes(this._element, 'paddingRight')\n this._resetElementAttributes(SELECTOR_FIXED_CONTENT, 'paddingRight')\n this._resetElementAttributes(SELECTOR_STICKY_CONTENT, 'marginRight')\n }\n\n _saveInitialAttribute(element, styleProp) {\n const actualValue = element.style[styleProp]\n if (actualValue) {\n Manipulator.setDataAttribute(element, styleProp, actualValue)\n }\n }\n\n _resetElementAttributes(selector, styleProp) {\n const manipulationCallBack = element => {\n const value = Manipulator.getDataAttribute(element, styleProp)\n if (typeof value === 'undefined') {\n element.style.removeProperty(styleProp)\n } else {\n Manipulator.removeDataAttribute(element, styleProp)\n element.style[styleProp] = value\n }\n }\n\n this._applyManipulationCallback(selector, manipulationCallBack)\n }\n\n _applyManipulationCallback(selector, callBack) {\n if (isElement(selector)) {\n callBack(selector)\n } else {\n SelectorEngine.find(selector, this._element).forEach(callBack)\n }\n }\n\n isOverflowing() {\n return this.getWidth() > 0\n }\n}\n\nexport default ScrollBarHelper\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/backdrop.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport EventHandler from '../dom/event-handler'\nimport { execute, executeAfterTransition, getElement, reflow, typeCheckConfig } from './index'\n\nconst Default = {\n className: 'modal-backdrop',\n isVisible: true, // if false, we use the backdrop helper without adding any element to the dom\n isAnimated: false,\n rootElement: 'body', // give the choice to place backdrop under different elements\n clickCallback: null\n}\n\nconst DefaultType = {\n className: 'string',\n isVisible: 'boolean',\n isAnimated: 'boolean',\n rootElement: '(element|string)',\n clickCallback: '(function|null)'\n}\nconst NAME = 'backdrop'\nconst CLASS_NAME_FADE = 'fade'\nconst CLASS_NAME_SHOW = 'show'\n\nconst EVENT_MOUSEDOWN = `mousedown.bs.${NAME}`\n\nclass Backdrop {\n constructor(config) {\n this._config = this._getConfig(config)\n this._isAppended = false\n this._element = null\n }\n\n show(callback) {\n if (!this._config.isVisible) {\n execute(callback)\n return\n }\n\n this._append()\n\n if (this._config.isAnimated) {\n reflow(this._getElement())\n }\n\n this._getElement().classList.add(CLASS_NAME_SHOW)\n\n this._emulateAnimation(() => {\n execute(callback)\n })\n }\n\n hide(callback) {\n if (!this._config.isVisible) {\n execute(callback)\n return\n }\n\n this._getElement().classList.remove(CLASS_NAME_SHOW)\n\n this._emulateAnimation(() => {\n this.dispose()\n execute(callback)\n })\n }\n\n // Private\n\n _getElement() {\n if (!this._element) {\n const backdrop = document.createElement('div')\n backdrop.className = this._config.className\n if (this._config.isAnimated) {\n backdrop.classList.add(CLASS_NAME_FADE)\n }\n\n this._element = backdrop\n }\n\n return this._element\n }\n\n _getConfig(config) {\n config = {\n ...Default,\n ...(typeof config === 'object' ? config : {})\n }\n\n // use getElement() with the default \"body\" to get a fresh Element on each instantiation\n config.rootElement = getElement(config.rootElement)\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n\n _append() {\n if (this._isAppended) {\n return\n }\n\n this._config.rootElement.append(this._getElement())\n\n EventHandler.on(this._getElement(), EVENT_MOUSEDOWN, () => {\n execute(this._config.clickCallback)\n })\n\n this._isAppended = true\n }\n\n dispose() {\n if (!this._isAppended) {\n return\n }\n\n EventHandler.off(this._element, EVENT_MOUSEDOWN)\n\n this._element.remove()\n this._isAppended = false\n }\n\n _emulateAnimation(callback) {\n executeAfterTransition(callback, this._getElement(), this._config.isAnimated)\n }\n}\n\nexport default Backdrop\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/focustrap.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport EventHandler from '../dom/event-handler'\nimport SelectorEngine from '../dom/selector-engine'\nimport { typeCheckConfig } from './index'\n\nconst Default = {\n trapElement: null, // The element to trap focus inside of\n autofocus: true\n}\n\nconst DefaultType = {\n trapElement: 'element',\n autofocus: 'boolean'\n}\n\nconst NAME = 'focustrap'\nconst DATA_KEY = 'bs.focustrap'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst EVENT_FOCUSIN = `focusin${EVENT_KEY}`\nconst EVENT_KEYDOWN_TAB = `keydown.tab${EVENT_KEY}`\n\nconst TAB_KEY = 'Tab'\nconst TAB_NAV_FORWARD = 'forward'\nconst TAB_NAV_BACKWARD = 'backward'\n\nclass FocusTrap {\n constructor(config) {\n this._config = this._getConfig(config)\n this._isActive = false\n this._lastTabNavDirection = null\n }\n\n activate() {\n const { trapElement, autofocus } = this._config\n\n if (this._isActive) {\n return\n }\n\n if (autofocus) {\n trapElement.focus()\n }\n\n EventHandler.off(document, EVENT_KEY) // guard against infinite focus loop\n EventHandler.on(document, EVENT_FOCUSIN, event => this._handleFocusin(event))\n EventHandler.on(document, EVENT_KEYDOWN_TAB, event => this._handleKeydown(event))\n\n this._isActive = true\n }\n\n deactivate() {\n if (!this._isActive) {\n return\n }\n\n this._isActive = false\n EventHandler.off(document, EVENT_KEY)\n }\n\n // Private\n\n _handleFocusin(event) {\n const { target } = event\n const { trapElement } = this._config\n\n if (\n target === document ||\n target === trapElement ||\n trapElement.contains(target)\n ) {\n return\n }\n\n const elements = SelectorEngine.focusableChildren(trapElement)\n\n if (elements.length === 0) {\n trapElement.focus()\n } else if (this._lastTabNavDirection === TAB_NAV_BACKWARD) {\n elements[elements.length - 1].focus()\n } else {\n elements[0].focus()\n }\n }\n\n _handleKeydown(event) {\n if (event.key !== TAB_KEY) {\n return\n }\n\n this._lastTabNavDirection = event.shiftKey ? TAB_NAV_BACKWARD : TAB_NAV_FORWARD\n }\n\n _getConfig(config) {\n config = {\n ...Default,\n ...(typeof config === 'object' ? config : {})\n }\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n}\n\nexport default FocusTrap\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): modal.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport {\n defineJQueryPlugin,\n getElementFromSelector,\n isRTL,\n isVisible,\n reflow,\n typeCheckConfig\n} from './util/index'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport ScrollBarHelper from './util/scrollbar'\nimport BaseComponent from './base-component'\nimport Backdrop from './util/backdrop'\nimport FocusTrap from './util/focustrap'\nimport { enableDismissTrigger } from './util/component-functions'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'modal'\nconst DATA_KEY = 'bs.modal'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\nconst ESCAPE_KEY = 'Escape'\n\nconst Default = {\n backdrop: true,\n keyboard: true,\n focus: true\n}\n\nconst DefaultType = {\n backdrop: '(boolean|string)',\n keyboard: 'boolean',\n focus: 'boolean'\n}\n\nconst EVENT_HIDE = `hide${EVENT_KEY}`\nconst EVENT_HIDE_PREVENTED = `hidePrevented${EVENT_KEY}`\nconst EVENT_HIDDEN = `hidden${EVENT_KEY}`\nconst EVENT_SHOW = `show${EVENT_KEY}`\nconst EVENT_SHOWN = `shown${EVENT_KEY}`\nconst EVENT_RESIZE = `resize${EVENT_KEY}`\nconst EVENT_CLICK_DISMISS = `click.dismiss${EVENT_KEY}`\nconst EVENT_KEYDOWN_DISMISS = `keydown.dismiss${EVENT_KEY}`\nconst EVENT_MOUSEUP_DISMISS = `mouseup.dismiss${EVENT_KEY}`\nconst EVENT_MOUSEDOWN_DISMISS = `mousedown.dismiss${EVENT_KEY}`\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\n\nconst CLASS_NAME_OPEN = 'modal-open'\nconst CLASS_NAME_FADE = 'fade'\nconst CLASS_NAME_SHOW = 'show'\nconst CLASS_NAME_STATIC = 'modal-static'\n\nconst SELECTOR_DIALOG = '.modal-dialog'\nconst SELECTOR_MODAL_BODY = '.modal-body'\nconst SELECTOR_DATA_TOGGLE = '[data-bs-toggle=\"modal\"]'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Modal extends BaseComponent {\n constructor(element, config) {\n super(element)\n\n this._config = this._getConfig(config)\n this._dialog = SelectorEngine.findOne(SELECTOR_DIALOG, this._element)\n this._backdrop = this._initializeBackDrop()\n this._focustrap = this._initializeFocusTrap()\n this._isShown = false\n this._ignoreBackdropClick = false\n this._isTransitioning = false\n this._scrollBar = new ScrollBarHelper()\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n toggle(relatedTarget) {\n return this._isShown ? this.hide() : this.show(relatedTarget)\n }\n\n show(relatedTarget) {\n if (this._isShown || this._isTransitioning) {\n return\n }\n\n const showEvent = EventHandler.trigger(this._element, EVENT_SHOW, {\n relatedTarget\n })\n\n if (showEvent.defaultPrevented) {\n return\n }\n\n this._isShown = true\n\n if (this._isAnimated()) {\n this._isTransitioning = true\n }\n\n this._scrollBar.hide()\n\n document.body.classList.add(CLASS_NAME_OPEN)\n\n this._adjustDialog()\n\n this._setEscapeEvent()\n this._setResizeEvent()\n\n EventHandler.on(this._dialog, EVENT_MOUSEDOWN_DISMISS, () => {\n EventHandler.one(this._element, EVENT_MOUSEUP_DISMISS, event => {\n if (event.target === this._element) {\n this._ignoreBackdropClick = true\n }\n })\n })\n\n this._showBackdrop(() => this._showElement(relatedTarget))\n }\n\n hide() {\n if (!this._isShown || this._isTransitioning) {\n return\n }\n\n const hideEvent = EventHandler.trigger(this._element, EVENT_HIDE)\n\n if (hideEvent.defaultPrevented) {\n return\n }\n\n this._isShown = false\n const isAnimated = this._isAnimated()\n\n if (isAnimated) {\n this._isTransitioning = true\n }\n\n this._setEscapeEvent()\n this._setResizeEvent()\n\n this._focustrap.deactivate()\n\n this._element.classList.remove(CLASS_NAME_SHOW)\n\n EventHandler.off(this._element, EVENT_CLICK_DISMISS)\n EventHandler.off(this._dialog, EVENT_MOUSEDOWN_DISMISS)\n\n this._queueCallback(() => this._hideModal(), this._element, isAnimated)\n }\n\n dispose() {\n [window, this._dialog]\n .forEach(htmlElement => EventHandler.off(htmlElement, EVENT_KEY))\n\n this._backdrop.dispose()\n this._focustrap.deactivate()\n super.dispose()\n }\n\n handleUpdate() {\n this._adjustDialog()\n }\n\n // Private\n\n _initializeBackDrop() {\n return new Backdrop({\n isVisible: Boolean(this._config.backdrop), // 'static' option will be translated to true, and booleans will keep their value\n isAnimated: this._isAnimated()\n })\n }\n\n _initializeFocusTrap() {\n return new FocusTrap({\n trapElement: this._element\n })\n }\n\n _getConfig(config) {\n config = {\n ...Default,\n ...Manipulator.getDataAttributes(this._element),\n ...(typeof config === 'object' ? config : {})\n }\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n\n _showElement(relatedTarget) {\n const isAnimated = this._isAnimated()\n const modalBody = SelectorEngine.findOne(SELECTOR_MODAL_BODY, this._dialog)\n\n if (!this._element.parentNode || this._element.parentNode.nodeType !== Node.ELEMENT_NODE) {\n // Don't move modal's DOM position\n document.body.append(this._element)\n }\n\n this._element.style.display = 'block'\n this._element.removeAttribute('aria-hidden')\n this._element.setAttribute('aria-modal', true)\n this._element.setAttribute('role', 'dialog')\n this._element.scrollTop = 0\n\n if (modalBody) {\n modalBody.scrollTop = 0\n }\n\n if (isAnimated) {\n reflow(this._element)\n }\n\n this._element.classList.add(CLASS_NAME_SHOW)\n\n const transitionComplete = () => {\n if (this._config.focus) {\n this._focustrap.activate()\n }\n\n this._isTransitioning = false\n EventHandler.trigger(this._element, EVENT_SHOWN, {\n relatedTarget\n })\n }\n\n this._queueCallback(transitionComplete, this._dialog, isAnimated)\n }\n\n _setEscapeEvent() {\n if (this._isShown) {\n EventHandler.on(this._element, EVENT_KEYDOWN_DISMISS, event => {\n if (this._config.keyboard && event.key === ESCAPE_KEY) {\n event.preventDefault()\n this.hide()\n } else if (!this._config.keyboard && event.key === ESCAPE_KEY) {\n this._triggerBackdropTransition()\n }\n })\n } else {\n EventHandler.off(this._element, EVENT_KEYDOWN_DISMISS)\n }\n }\n\n _setResizeEvent() {\n if (this._isShown) {\n EventHandler.on(window, EVENT_RESIZE, () => this._adjustDialog())\n } else {\n EventHandler.off(window, EVENT_RESIZE)\n }\n }\n\n _hideModal() {\n this._element.style.display = 'none'\n this._element.setAttribute('aria-hidden', true)\n this._element.removeAttribute('aria-modal')\n this._element.removeAttribute('role')\n this._isTransitioning = false\n this._backdrop.hide(() => {\n document.body.classList.remove(CLASS_NAME_OPEN)\n this._resetAdjustments()\n this._scrollBar.reset()\n EventHandler.trigger(this._element, EVENT_HIDDEN)\n })\n }\n\n _showBackdrop(callback) {\n EventHandler.on(this._element, EVENT_CLICK_DISMISS, event => {\n if (this._ignoreBackdropClick) {\n this._ignoreBackdropClick = false\n return\n }\n\n if (event.target !== event.currentTarget) {\n return\n }\n\n if (this._config.backdrop === true) {\n this.hide()\n } else if (this._config.backdrop === 'static') {\n this._triggerBackdropTransition()\n }\n })\n\n this._backdrop.show(callback)\n }\n\n _isAnimated() {\n return this._element.classList.contains(CLASS_NAME_FADE)\n }\n\n _triggerBackdropTransition() {\n const hideEvent = EventHandler.trigger(this._element, EVENT_HIDE_PREVENTED)\n if (hideEvent.defaultPrevented) {\n return\n }\n\n const { classList, scrollHeight, style } = this._element\n const isModalOverflowing = scrollHeight > document.documentElement.clientHeight\n\n // return if the following background transition hasn't yet completed\n if ((!isModalOverflowing && style.overflowY === 'hidden') || classList.contains(CLASS_NAME_STATIC)) {\n return\n }\n\n if (!isModalOverflowing) {\n style.overflowY = 'hidden'\n }\n\n classList.add(CLASS_NAME_STATIC)\n this._queueCallback(() => {\n classList.remove(CLASS_NAME_STATIC)\n if (!isModalOverflowing) {\n this._queueCallback(() => {\n style.overflowY = ''\n }, this._dialog)\n }\n }, this._dialog)\n\n this._element.focus()\n }\n\n // ----------------------------------------------------------------------\n // the following methods are used to handle overflowing modals\n // ----------------------------------------------------------------------\n\n _adjustDialog() {\n const isModalOverflowing = this._element.scrollHeight > document.documentElement.clientHeight\n const scrollbarWidth = this._scrollBar.getWidth()\n const isBodyOverflowing = scrollbarWidth > 0\n\n if ((!isBodyOverflowing && isModalOverflowing && !isRTL()) || (isBodyOverflowing && !isModalOverflowing && isRTL())) {\n this._element.style.paddingLeft = `${scrollbarWidth}px`\n }\n\n if ((isBodyOverflowing && !isModalOverflowing && !isRTL()) || (!isBodyOverflowing && isModalOverflowing && isRTL())) {\n this._element.style.paddingRight = `${scrollbarWidth}px`\n }\n }\n\n _resetAdjustments() {\n this._element.style.paddingLeft = ''\n this._element.style.paddingRight = ''\n }\n\n // Static\n\n static jQueryInterface(config, relatedTarget) {\n return this.each(function () {\n const data = Modal.getOrCreateInstance(this, config)\n\n if (typeof config !== 'string') {\n return\n }\n\n if (typeof data[config] === 'undefined') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config](relatedTarget)\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_TOGGLE, function (event) {\n const target = getElementFromSelector(this)\n\n if (['A', 'AREA'].includes(this.tagName)) {\n event.preventDefault()\n }\n\n EventHandler.one(target, EVENT_SHOW, showEvent => {\n if (showEvent.defaultPrevented) {\n // only register focus restorer if modal will actually get shown\n return\n }\n\n EventHandler.one(target, EVENT_HIDDEN, () => {\n if (isVisible(this)) {\n this.focus()\n }\n })\n })\n\n const data = Modal.getOrCreateInstance(target)\n\n data.toggle(this)\n})\n\nenableDismissTrigger(Modal)\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Modal to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Modal)\n\nexport default Modal\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): offcanvas.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport {\n defineJQueryPlugin,\n getElementFromSelector,\n isDisabled,\n isVisible,\n typeCheckConfig\n} from './util/index'\nimport ScrollBarHelper from './util/scrollbar'\nimport EventHandler from './dom/event-handler'\nimport BaseComponent from './base-component'\nimport SelectorEngine from './dom/selector-engine'\nimport Manipulator from './dom/manipulator'\nimport Backdrop from './util/backdrop'\nimport FocusTrap from './util/focustrap'\nimport { enableDismissTrigger } from './util/component-functions'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'offcanvas'\nconst DATA_KEY = 'bs.offcanvas'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\nconst EVENT_LOAD_DATA_API = `load${EVENT_KEY}${DATA_API_KEY}`\nconst ESCAPE_KEY = 'Escape'\n\nconst Default = {\n backdrop: true,\n keyboard: true,\n scroll: false\n}\n\nconst DefaultType = {\n backdrop: 'boolean',\n keyboard: 'boolean',\n scroll: 'boolean'\n}\n\nconst CLASS_NAME_SHOW = 'show'\nconst CLASS_NAME_BACKDROP = 'offcanvas-backdrop'\nconst OPEN_SELECTOR = '.offcanvas.show'\n\nconst EVENT_SHOW = `show${EVENT_KEY}`\nconst EVENT_SHOWN = `shown${EVENT_KEY}`\nconst EVENT_HIDE = `hide${EVENT_KEY}`\nconst EVENT_HIDDEN = `hidden${EVENT_KEY}`\nconst EVENT_CLICK_DATA_API = `click${EVENT_KEY}${DATA_API_KEY}`\nconst EVENT_KEYDOWN_DISMISS = `keydown.dismiss${EVENT_KEY}`\n\nconst SELECTOR_DATA_TOGGLE = '[data-bs-toggle=\"offcanvas\"]'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Offcanvas extends BaseComponent {\n constructor(element, config) {\n super(element)\n\n this._config = this._getConfig(config)\n this._isShown = false\n this._backdrop = this._initializeBackDrop()\n this._focustrap = this._initializeFocusTrap()\n this._addEventListeners()\n }\n\n // Getters\n\n static get NAME() {\n return NAME\n }\n\n static get Default() {\n return Default\n }\n\n // Public\n\n toggle(relatedTarget) {\n return this._isShown ? this.hide() : this.show(relatedTarget)\n }\n\n show(relatedTarget) {\n if (this._isShown) {\n return\n }\n\n const showEvent = EventHandler.trigger(this._element, EVENT_SHOW, { relatedTarget })\n\n if (showEvent.defaultPrevented) {\n return\n }\n\n this._isShown = true\n this._element.style.visibility = 'visible'\n\n this._backdrop.show()\n\n if (!this._config.scroll) {\n new ScrollBarHelper().hide()\n }\n\n this._element.removeAttribute('aria-hidden')\n this._element.setAttribute('aria-modal', true)\n this._element.setAttribute('role', 'dialog')\n this._element.classList.add(CLASS_NAME_SHOW)\n\n const completeCallBack = () => {\n if (!this._config.scroll) {\n this._focustrap.activate()\n }\n\n EventHandler.trigger(this._element, EVENT_SHOWN, { relatedTarget })\n }\n\n this._queueCallback(completeCallBack, this._element, true)\n }\n\n hide() {\n if (!this._isShown) {\n return\n }\n\n const hideEvent = EventHandler.trigger(this._element, EVENT_HIDE)\n\n if (hideEvent.defaultPrevented) {\n return\n }\n\n this._focustrap.deactivate()\n this._element.blur()\n this._isShown = false\n this._element.classList.remove(CLASS_NAME_SHOW)\n this._backdrop.hide()\n\n const completeCallback = () => {\n this._element.setAttribute('aria-hidden', true)\n this._element.removeAttribute('aria-modal')\n this._element.removeAttribute('role')\n this._element.style.visibility = 'hidden'\n\n if (!this._config.scroll) {\n new ScrollBarHelper().reset()\n }\n\n EventHandler.trigger(this._element, EVENT_HIDDEN)\n }\n\n this._queueCallback(completeCallback, this._element, true)\n }\n\n dispose() {\n this._backdrop.dispose()\n this._focustrap.deactivate()\n super.dispose()\n }\n\n // Private\n\n _getConfig(config) {\n config = {\n ...Default,\n ...Manipulator.getDataAttributes(this._element),\n ...(typeof config === 'object' ? config : {})\n }\n typeCheckConfig(NAME, config, DefaultType)\n return config\n }\n\n _initializeBackDrop() {\n return new Backdrop({\n className: CLASS_NAME_BACKDROP,\n isVisible: this._config.backdrop,\n isAnimated: true,\n rootElement: this._element.parentNode,\n clickCallback: () => this.hide()\n })\n }\n\n _initializeFocusTrap() {\n return new FocusTrap({\n trapElement: this._element\n })\n }\n\n _addEventListeners() {\n EventHandler.on(this._element, EVENT_KEYDOWN_DISMISS, event => {\n if (this._config.keyboard && event.key === ESCAPE_KEY) {\n this.hide()\n }\n })\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Offcanvas.getOrCreateInstance(this, config)\n\n if (typeof config !== 'string') {\n return\n }\n\n if (data[config] === undefined || config.startsWith('_') || config === 'constructor') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config](this)\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * Data Api implementation\n * ------------------------------------------------------------------------\n */\n\nEventHandler.on(document, EVENT_CLICK_DATA_API, SELECTOR_DATA_TOGGLE, function (event) {\n const target = getElementFromSelector(this)\n\n if (['A', 'AREA'].includes(this.tagName)) {\n event.preventDefault()\n }\n\n if (isDisabled(this)) {\n return\n }\n\n EventHandler.one(target, EVENT_HIDDEN, () => {\n // focus on trigger when it is closed\n if (isVisible(this)) {\n this.focus()\n }\n })\n\n // avoid conflict when clicking a toggler of an offcanvas, while another is open\n const allReadyOpen = SelectorEngine.findOne(OPEN_SELECTOR)\n if (allReadyOpen && allReadyOpen !== target) {\n Offcanvas.getInstance(allReadyOpen).hide()\n }\n\n const data = Offcanvas.getOrCreateInstance(target)\n data.toggle(this)\n})\n\nEventHandler.on(window, EVENT_LOAD_DATA_API, () =>\n SelectorEngine.find(OPEN_SELECTOR).forEach(el => Offcanvas.getOrCreateInstance(el).show())\n)\n\nenableDismissTrigger(Offcanvas)\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n */\n\ndefineJQueryPlugin(Offcanvas)\n\nexport default Offcanvas\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): util/sanitizer.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nconst uriAttrs = new Set([\n 'background',\n 'cite',\n 'href',\n 'itemtype',\n 'longdesc',\n 'poster',\n 'src',\n 'xlink:href'\n])\n\nconst ARIA_ATTRIBUTE_PATTERN = /^aria-[\\w-]*$/i\n\n/**\n * A pattern that recognizes a commonly useful subset of URLs that are safe.\n *\n * Shoutout to Angular 7 https://github.com/angular/angular/blob/7.2.4/packages/core/src/sanitization/url_sanitizer.ts\n */\nconst SAFE_URL_PATTERN = /^(?:(?:https?|mailto|ftp|tel|file):|[^#&/:?]*(?:[#/?]|$))/i\n\n/**\n * A pattern that matches safe data URLs. Only matches image, video and audio types.\n *\n * Shoutout to Angular 7 https://github.com/angular/angular/blob/7.2.4/packages/core/src/sanitization/url_sanitizer.ts\n */\nconst DATA_URL_PATTERN = /^data:(?:image\\/(?:bmp|gif|jpeg|jpg|png|tiff|webp)|video\\/(?:mpeg|mp4|ogg|webm)|audio\\/(?:mp3|oga|ogg|opus));base64,[\\d+/a-z]+=*$/i\n\nconst allowedAttribute = (attr, allowedAttributeList) => {\n const attrName = attr.nodeName.toLowerCase()\n\n if (allowedAttributeList.includes(attrName)) {\n if (uriAttrs.has(attrName)) {\n return Boolean(SAFE_URL_PATTERN.test(attr.nodeValue) || DATA_URL_PATTERN.test(attr.nodeValue))\n }\n\n return true\n }\n\n const regExp = allowedAttributeList.filter(attrRegex => attrRegex instanceof RegExp)\n\n // Check if a regular expression validates the attribute.\n for (let i = 0, len = regExp.length; i < len; i++) {\n if (regExp[i].test(attrName)) {\n return true\n }\n }\n\n return false\n}\n\nexport const DefaultAllowlist = {\n // Global attributes allowed on any supplied element below.\n '*': ['class', 'dir', 'id', 'lang', 'role', ARIA_ATTRIBUTE_PATTERN],\n a: ['target', 'href', 'title', 'rel'],\n area: [],\n b: [],\n br: [],\n col: [],\n code: [],\n div: [],\n em: [],\n hr: [],\n h1: [],\n h2: [],\n h3: [],\n h4: [],\n h5: [],\n h6: [],\n i: [],\n img: ['src', 'srcset', 'alt', 'title', 'width', 'height'],\n li: [],\n ol: [],\n p: [],\n pre: [],\n s: [],\n small: [],\n span: [],\n sub: [],\n sup: [],\n strong: [],\n u: [],\n ul: []\n}\n\nexport function sanitizeHtml(unsafeHtml, allowList, sanitizeFn) {\n if (!unsafeHtml.length) {\n return unsafeHtml\n }\n\n if (sanitizeFn && typeof sanitizeFn === 'function') {\n return sanitizeFn(unsafeHtml)\n }\n\n const domParser = new window.DOMParser()\n const createdDocument = domParser.parseFromString(unsafeHtml, 'text/html')\n const allowlistKeys = Object.keys(allowList)\n const elements = [].concat(...createdDocument.body.querySelectorAll('*'))\n\n for (let i = 0, len = elements.length; i < len; i++) {\n const el = elements[i]\n const elName = el.nodeName.toLowerCase()\n\n if (!allowlistKeys.includes(elName)) {\n el.remove()\n\n continue\n }\n\n const attributeList = [].concat(...el.attributes)\n const allowedAttributes = [].concat(allowList['*'] || [], allowList[elName] || [])\n\n attributeList.forEach(attr => {\n if (!allowedAttribute(attr, allowedAttributes)) {\n el.removeAttribute(attr.nodeName)\n }\n })\n }\n\n return createdDocument.body.innerHTML\n}\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): tooltip.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport * as Popper from '@popperjs/core'\n\nimport {\n defineJQueryPlugin,\n findShadowRoot,\n getElement,\n getUID,\n isElement,\n isRTL,\n noop,\n typeCheckConfig\n} from './util/index'\nimport { DefaultAllowlist, sanitizeHtml } from './util/sanitizer'\nimport Data from './dom/data'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'tooltip'\nconst DATA_KEY = 'bs.tooltip'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst CLASS_PREFIX = 'bs-tooltip'\nconst DISALLOWED_ATTRIBUTES = new Set(['sanitize', 'allowList', 'sanitizeFn'])\n\nconst DefaultType = {\n animation: 'boolean',\n template: 'string',\n title: '(string|element|function)',\n trigger: 'string',\n delay: '(number|object)',\n html: 'boolean',\n selector: '(string|boolean)',\n placement: '(string|function)',\n offset: '(array|string|function)',\n container: '(string|element|boolean)',\n fallbackPlacements: 'array',\n boundary: '(string|element)',\n customClass: '(string|function)',\n sanitize: 'boolean',\n sanitizeFn: '(null|function)',\n allowList: 'object',\n popperConfig: '(null|object|function)'\n}\n\nconst AttachmentMap = {\n AUTO: 'auto',\n TOP: 'top',\n RIGHT: isRTL() ? 'left' : 'right',\n BOTTOM: 'bottom',\n LEFT: isRTL() ? 'right' : 'left'\n}\n\nconst Default = {\n animation: true,\n template: '
' +\n '
' +\n '
' +\n '
',\n trigger: 'hover focus',\n title: '',\n delay: 0,\n html: false,\n selector: false,\n placement: 'top',\n offset: [0, 0],\n container: false,\n fallbackPlacements: ['top', 'right', 'bottom', 'left'],\n boundary: 'clippingParents',\n customClass: '',\n sanitize: true,\n sanitizeFn: null,\n allowList: DefaultAllowlist,\n popperConfig: null\n}\n\nconst Event = {\n HIDE: `hide${EVENT_KEY}`,\n HIDDEN: `hidden${EVENT_KEY}`,\n SHOW: `show${EVENT_KEY}`,\n SHOWN: `shown${EVENT_KEY}`,\n INSERTED: `inserted${EVENT_KEY}`,\n CLICK: `click${EVENT_KEY}`,\n FOCUSIN: `focusin${EVENT_KEY}`,\n FOCUSOUT: `focusout${EVENT_KEY}`,\n MOUSEENTER: `mouseenter${EVENT_KEY}`,\n MOUSELEAVE: `mouseleave${EVENT_KEY}`\n}\n\nconst CLASS_NAME_FADE = 'fade'\nconst CLASS_NAME_MODAL = 'modal'\nconst CLASS_NAME_SHOW = 'show'\n\nconst HOVER_STATE_SHOW = 'show'\nconst HOVER_STATE_OUT = 'out'\n\nconst SELECTOR_TOOLTIP_INNER = '.tooltip-inner'\nconst SELECTOR_MODAL = `.${CLASS_NAME_MODAL}`\n\nconst EVENT_MODAL_HIDE = 'hide.bs.modal'\n\nconst TRIGGER_HOVER = 'hover'\nconst TRIGGER_FOCUS = 'focus'\nconst TRIGGER_CLICK = 'click'\nconst TRIGGER_MANUAL = 'manual'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Tooltip extends BaseComponent {\n constructor(element, config) {\n if (typeof Popper === 'undefined') {\n throw new TypeError('Bootstrap\\'s tooltips require Popper (https://popper.js.org)')\n }\n\n super(element)\n\n // private\n this._isEnabled = true\n this._timeout = 0\n this._hoverState = ''\n this._activeTrigger = {}\n this._popper = null\n\n // Protected\n this._config = this._getConfig(config)\n this.tip = null\n\n this._setListeners()\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n static get Event() {\n return Event\n }\n\n static get DefaultType() {\n return DefaultType\n }\n\n // Public\n\n enable() {\n this._isEnabled = true\n }\n\n disable() {\n this._isEnabled = false\n }\n\n toggleEnabled() {\n this._isEnabled = !this._isEnabled\n }\n\n toggle(event) {\n if (!this._isEnabled) {\n return\n }\n\n if (event) {\n const context = this._initializeOnDelegatedTarget(event)\n\n context._activeTrigger.click = !context._activeTrigger.click\n\n if (context._isWithActiveTrigger()) {\n context._enter(null, context)\n } else {\n context._leave(null, context)\n }\n } else {\n if (this.getTipElement().classList.contains(CLASS_NAME_SHOW)) {\n this._leave(null, this)\n return\n }\n\n this._enter(null, this)\n }\n }\n\n dispose() {\n clearTimeout(this._timeout)\n\n EventHandler.off(this._element.closest(SELECTOR_MODAL), EVENT_MODAL_HIDE, this._hideModalHandler)\n\n if (this.tip) {\n this.tip.remove()\n }\n\n if (this._popper) {\n this._popper.destroy()\n }\n\n super.dispose()\n }\n\n show() {\n if (this._element.style.display === 'none') {\n throw new Error('Please use show on visible elements')\n }\n\n if (!(this.isWithContent() && this._isEnabled)) {\n return\n }\n\n const showEvent = EventHandler.trigger(this._element, this.constructor.Event.SHOW)\n const shadowRoot = findShadowRoot(this._element)\n const isInTheDom = shadowRoot === null ?\n this._element.ownerDocument.documentElement.contains(this._element) :\n shadowRoot.contains(this._element)\n\n if (showEvent.defaultPrevented || !isInTheDom) {\n return\n }\n\n const tip = this.getTipElement()\n const tipId = getUID(this.constructor.NAME)\n\n tip.setAttribute('id', tipId)\n this._element.setAttribute('aria-describedby', tipId)\n\n if (this._config.animation) {\n tip.classList.add(CLASS_NAME_FADE)\n }\n\n const placement = typeof this._config.placement === 'function' ?\n this._config.placement.call(this, tip, this._element) :\n this._config.placement\n\n const attachment = this._getAttachment(placement)\n this._addAttachmentClass(attachment)\n\n const { container } = this._config\n Data.set(tip, this.constructor.DATA_KEY, this)\n\n if (!this._element.ownerDocument.documentElement.contains(this.tip)) {\n container.append(tip)\n EventHandler.trigger(this._element, this.constructor.Event.INSERTED)\n }\n\n if (this._popper) {\n this._popper.update()\n } else {\n this._popper = Popper.createPopper(this._element, tip, this._getPopperConfig(attachment))\n }\n\n tip.classList.add(CLASS_NAME_SHOW)\n\n const customClass = this._resolvePossibleFunction(this._config.customClass)\n if (customClass) {\n tip.classList.add(...customClass.split(' '))\n }\n\n // If this is a touch-enabled device we add extra\n // empty mouseover listeners to the body's immediate children;\n // only needed because of broken event delegation on iOS\n // https://www.quirksmode.org/blog/archives/2014/02/mouse_event_bub.html\n if ('ontouchstart' in document.documentElement) {\n [].concat(...document.body.children).forEach(element => {\n EventHandler.on(element, 'mouseover', noop)\n })\n }\n\n const complete = () => {\n const prevHoverState = this._hoverState\n\n this._hoverState = null\n EventHandler.trigger(this._element, this.constructor.Event.SHOWN)\n\n if (prevHoverState === HOVER_STATE_OUT) {\n this._leave(null, this)\n }\n }\n\n const isAnimated = this.tip.classList.contains(CLASS_NAME_FADE)\n this._queueCallback(complete, this.tip, isAnimated)\n }\n\n hide() {\n if (!this._popper) {\n return\n }\n\n const tip = this.getTipElement()\n const complete = () => {\n if (this._isWithActiveTrigger()) {\n return\n }\n\n if (this._hoverState !== HOVER_STATE_SHOW) {\n tip.remove()\n }\n\n this._cleanTipClass()\n this._element.removeAttribute('aria-describedby')\n EventHandler.trigger(this._element, this.constructor.Event.HIDDEN)\n\n if (this._popper) {\n this._popper.destroy()\n this._popper = null\n }\n }\n\n const hideEvent = EventHandler.trigger(this._element, this.constructor.Event.HIDE)\n if (hideEvent.defaultPrevented) {\n return\n }\n\n tip.classList.remove(CLASS_NAME_SHOW)\n\n // If this is a touch-enabled device we remove the extra\n // empty mouseover listeners we added for iOS support\n if ('ontouchstart' in document.documentElement) {\n [].concat(...document.body.children)\n .forEach(element => EventHandler.off(element, 'mouseover', noop))\n }\n\n this._activeTrigger[TRIGGER_CLICK] = false\n this._activeTrigger[TRIGGER_FOCUS] = false\n this._activeTrigger[TRIGGER_HOVER] = false\n\n const isAnimated = this.tip.classList.contains(CLASS_NAME_FADE)\n this._queueCallback(complete, this.tip, isAnimated)\n this._hoverState = ''\n }\n\n update() {\n if (this._popper !== null) {\n this._popper.update()\n }\n }\n\n // Protected\n\n isWithContent() {\n return Boolean(this.getTitle())\n }\n\n getTipElement() {\n if (this.tip) {\n return this.tip\n }\n\n const element = document.createElement('div')\n element.innerHTML = this._config.template\n\n const tip = element.children[0]\n this.setContent(tip)\n tip.classList.remove(CLASS_NAME_FADE, CLASS_NAME_SHOW)\n\n this.tip = tip\n return this.tip\n }\n\n setContent(tip) {\n this._sanitizeAndSetContent(tip, this.getTitle(), SELECTOR_TOOLTIP_INNER)\n }\n\n _sanitizeAndSetContent(template, content, selector) {\n const templateElement = SelectorEngine.findOne(selector, template)\n\n if (!content && templateElement) {\n templateElement.remove()\n return\n }\n\n // we use append for html objects to maintain js events\n this.setElementContent(templateElement, content)\n }\n\n setElementContent(element, content) {\n if (element === null) {\n return\n }\n\n if (isElement(content)) {\n content = getElement(content)\n\n // content is a DOM node or a jQuery\n if (this._config.html) {\n if (content.parentNode !== element) {\n element.innerHTML = ''\n element.append(content)\n }\n } else {\n element.textContent = content.textContent\n }\n\n return\n }\n\n if (this._config.html) {\n if (this._config.sanitize) {\n content = sanitizeHtml(content, this._config.allowList, this._config.sanitizeFn)\n }\n\n element.innerHTML = content\n } else {\n element.textContent = content\n }\n }\n\n getTitle() {\n const title = this._element.getAttribute('data-bs-original-title') || this._config.title\n\n return this._resolvePossibleFunction(title)\n }\n\n updateAttachment(attachment) {\n if (attachment === 'right') {\n return 'end'\n }\n\n if (attachment === 'left') {\n return 'start'\n }\n\n return attachment\n }\n\n // Private\n\n _initializeOnDelegatedTarget(event, context) {\n return context || this.constructor.getOrCreateInstance(event.delegateTarget, this._getDelegateConfig())\n }\n\n _getOffset() {\n const { offset } = this._config\n\n if (typeof offset === 'string') {\n return offset.split(',').map(val => Number.parseInt(val, 10))\n }\n\n if (typeof offset === 'function') {\n return popperData => offset(popperData, this._element)\n }\n\n return offset\n }\n\n _resolvePossibleFunction(content) {\n return typeof content === 'function' ? content.call(this._element) : content\n }\n\n _getPopperConfig(attachment) {\n const defaultBsPopperConfig = {\n placement: attachment,\n modifiers: [\n {\n name: 'flip',\n options: {\n fallbackPlacements: this._config.fallbackPlacements\n }\n },\n {\n name: 'offset',\n options: {\n offset: this._getOffset()\n }\n },\n {\n name: 'preventOverflow',\n options: {\n boundary: this._config.boundary\n }\n },\n {\n name: 'arrow',\n options: {\n element: `.${this.constructor.NAME}-arrow`\n }\n },\n {\n name: 'onChange',\n enabled: true,\n phase: 'afterWrite',\n fn: data => this._handlePopperPlacementChange(data)\n }\n ],\n onFirstUpdate: data => {\n if (data.options.placement !== data.placement) {\n this._handlePopperPlacementChange(data)\n }\n }\n }\n\n return {\n ...defaultBsPopperConfig,\n ...(typeof this._config.popperConfig === 'function' ? this._config.popperConfig(defaultBsPopperConfig) : this._config.popperConfig)\n }\n }\n\n _addAttachmentClass(attachment) {\n this.getTipElement().classList.add(`${this._getBasicClassPrefix()}-${this.updateAttachment(attachment)}`)\n }\n\n _getAttachment(placement) {\n return AttachmentMap[placement.toUpperCase()]\n }\n\n _setListeners() {\n const triggers = this._config.trigger.split(' ')\n\n triggers.forEach(trigger => {\n if (trigger === 'click') {\n EventHandler.on(this._element, this.constructor.Event.CLICK, this._config.selector, event => this.toggle(event))\n } else if (trigger !== TRIGGER_MANUAL) {\n const eventIn = trigger === TRIGGER_HOVER ?\n this.constructor.Event.MOUSEENTER :\n this.constructor.Event.FOCUSIN\n const eventOut = trigger === TRIGGER_HOVER ?\n this.constructor.Event.MOUSELEAVE :\n this.constructor.Event.FOCUSOUT\n\n EventHandler.on(this._element, eventIn, this._config.selector, event => this._enter(event))\n EventHandler.on(this._element, eventOut, this._config.selector, event => this._leave(event))\n }\n })\n\n this._hideModalHandler = () => {\n if (this._element) {\n this.hide()\n }\n }\n\n EventHandler.on(this._element.closest(SELECTOR_MODAL), EVENT_MODAL_HIDE, this._hideModalHandler)\n\n if (this._config.selector) {\n this._config = {\n ...this._config,\n trigger: 'manual',\n selector: ''\n }\n } else {\n this._fixTitle()\n }\n }\n\n _fixTitle() {\n const title = this._element.getAttribute('title')\n const originalTitleType = typeof this._element.getAttribute('data-bs-original-title')\n\n if (title || originalTitleType !== 'string') {\n this._element.setAttribute('data-bs-original-title', title || '')\n if (title && !this._element.getAttribute('aria-label') && !this._element.textContent) {\n this._element.setAttribute('aria-label', title)\n }\n\n this._element.setAttribute('title', '')\n }\n }\n\n _enter(event, context) {\n context = this._initializeOnDelegatedTarget(event, context)\n\n if (event) {\n context._activeTrigger[\n event.type === 'focusin' ? TRIGGER_FOCUS : TRIGGER_HOVER\n ] = true\n }\n\n if (context.getTipElement().classList.contains(CLASS_NAME_SHOW) || context._hoverState === HOVER_STATE_SHOW) {\n context._hoverState = HOVER_STATE_SHOW\n return\n }\n\n clearTimeout(context._timeout)\n\n context._hoverState = HOVER_STATE_SHOW\n\n if (!context._config.delay || !context._config.delay.show) {\n context.show()\n return\n }\n\n context._timeout = setTimeout(() => {\n if (context._hoverState === HOVER_STATE_SHOW) {\n context.show()\n }\n }, context._config.delay.show)\n }\n\n _leave(event, context) {\n context = this._initializeOnDelegatedTarget(event, context)\n\n if (event) {\n context._activeTrigger[\n event.type === 'focusout' ? TRIGGER_FOCUS : TRIGGER_HOVER\n ] = context._element.contains(event.relatedTarget)\n }\n\n if (context._isWithActiveTrigger()) {\n return\n }\n\n clearTimeout(context._timeout)\n\n context._hoverState = HOVER_STATE_OUT\n\n if (!context._config.delay || !context._config.delay.hide) {\n context.hide()\n return\n }\n\n context._timeout = setTimeout(() => {\n if (context._hoverState === HOVER_STATE_OUT) {\n context.hide()\n }\n }, context._config.delay.hide)\n }\n\n _isWithActiveTrigger() {\n for (const trigger in this._activeTrigger) {\n if (this._activeTrigger[trigger]) {\n return true\n }\n }\n\n return false\n }\n\n _getConfig(config) {\n const dataAttributes = Manipulator.getDataAttributes(this._element)\n\n Object.keys(dataAttributes).forEach(dataAttr => {\n if (DISALLOWED_ATTRIBUTES.has(dataAttr)) {\n delete dataAttributes[dataAttr]\n }\n })\n\n config = {\n ...this.constructor.Default,\n ...dataAttributes,\n ...(typeof config === 'object' && config ? config : {})\n }\n\n config.container = config.container === false ? document.body : getElement(config.container)\n\n if (typeof config.delay === 'number') {\n config.delay = {\n show: config.delay,\n hide: config.delay\n }\n }\n\n if (typeof config.title === 'number') {\n config.title = config.title.toString()\n }\n\n if (typeof config.content === 'number') {\n config.content = config.content.toString()\n }\n\n typeCheckConfig(NAME, config, this.constructor.DefaultType)\n\n if (config.sanitize) {\n config.template = sanitizeHtml(config.template, config.allowList, config.sanitizeFn)\n }\n\n return config\n }\n\n _getDelegateConfig() {\n const config = {}\n\n for (const key in this._config) {\n if (this.constructor.Default[key] !== this._config[key]) {\n config[key] = this._config[key]\n }\n }\n\n // In the future can be replaced with:\n // const keysWithDifferentValues = Object.entries(this._config).filter(entry => this.constructor.Default[entry[0]] !== this._config[entry[0]])\n // `Object.fromEntries(keysWithDifferentValues)`\n return config\n }\n\n _cleanTipClass() {\n const tip = this.getTipElement()\n const basicClassPrefixRegex = new RegExp(`(^|\\\\s)${this._getBasicClassPrefix()}\\\\S+`, 'g')\n const tabClass = tip.getAttribute('class').match(basicClassPrefixRegex)\n if (tabClass !== null && tabClass.length > 0) {\n tabClass.map(token => token.trim())\n .forEach(tClass => tip.classList.remove(tClass))\n }\n }\n\n _getBasicClassPrefix() {\n return CLASS_PREFIX\n }\n\n _handlePopperPlacementChange(popperData) {\n const { state } = popperData\n\n if (!state) {\n return\n }\n\n this.tip = state.elements.popper\n this._cleanTipClass()\n this._addAttachmentClass(this._getAttachment(state.placement))\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Tooltip.getOrCreateInstance(this, config)\n\n if (typeof config === 'string') {\n if (typeof data[config] === 'undefined') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config]()\n }\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Tooltip to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Tooltip)\n\nexport default Tooltip\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): popover.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport { defineJQueryPlugin } from './util/index'\nimport Tooltip from './tooltip'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'popover'\nconst DATA_KEY = 'bs.popover'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst CLASS_PREFIX = 'bs-popover'\n\nconst Default = {\n ...Tooltip.Default,\n placement: 'right',\n offset: [0, 8],\n trigger: 'click',\n content: '',\n template: '
' +\n '
' +\n '

' +\n '
' +\n '
'\n}\n\nconst DefaultType = {\n ...Tooltip.DefaultType,\n content: '(string|element|function)'\n}\n\nconst Event = {\n HIDE: `hide${EVENT_KEY}`,\n HIDDEN: `hidden${EVENT_KEY}`,\n SHOW: `show${EVENT_KEY}`,\n SHOWN: `shown${EVENT_KEY}`,\n INSERTED: `inserted${EVENT_KEY}`,\n CLICK: `click${EVENT_KEY}`,\n FOCUSIN: `focusin${EVENT_KEY}`,\n FOCUSOUT: `focusout${EVENT_KEY}`,\n MOUSEENTER: `mouseenter${EVENT_KEY}`,\n MOUSELEAVE: `mouseleave${EVENT_KEY}`\n}\n\nconst SELECTOR_TITLE = '.popover-header'\nconst SELECTOR_CONTENT = '.popover-body'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass Popover extends Tooltip {\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n static get Event() {\n return Event\n }\n\n static get DefaultType() {\n return DefaultType\n }\n\n // Overrides\n\n isWithContent() {\n return this.getTitle() || this._getContent()\n }\n\n setContent(tip) {\n this._sanitizeAndSetContent(tip, this.getTitle(), SELECTOR_TITLE)\n this._sanitizeAndSetContent(tip, this._getContent(), SELECTOR_CONTENT)\n }\n\n // Private\n\n _getContent() {\n return this._resolvePossibleFunction(this._config.content)\n }\n\n _getBasicClassPrefix() {\n return CLASS_PREFIX\n }\n\n // Static\n\n static jQueryInterface(config) {\n return this.each(function () {\n const data = Popover.getOrCreateInstance(this, config)\n\n if (typeof config === 'string') {\n if (typeof data[config] === 'undefined') {\n throw new TypeError(`No method named \"${config}\"`)\n }\n\n data[config]()\n }\n })\n }\n}\n\n/**\n * ------------------------------------------------------------------------\n * jQuery\n * ------------------------------------------------------------------------\n * add .Popover to jQuery only if jQuery is present\n */\n\ndefineJQueryPlugin(Popover)\n\nexport default Popover\n","/**\n * --------------------------------------------------------------------------\n * Bootstrap (v5.1.0): scrollspy.js\n * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE)\n * --------------------------------------------------------------------------\n */\n\nimport {\n defineJQueryPlugin,\n getElement,\n getSelectorFromElement,\n typeCheckConfig\n} from './util/index'\nimport EventHandler from './dom/event-handler'\nimport Manipulator from './dom/manipulator'\nimport SelectorEngine from './dom/selector-engine'\nimport BaseComponent from './base-component'\n\n/**\n * ------------------------------------------------------------------------\n * Constants\n * ------------------------------------------------------------------------\n */\n\nconst NAME = 'scrollspy'\nconst DATA_KEY = 'bs.scrollspy'\nconst EVENT_KEY = `.${DATA_KEY}`\nconst DATA_API_KEY = '.data-api'\n\nconst Default = {\n offset: 10,\n method: 'auto',\n target: ''\n}\n\nconst DefaultType = {\n offset: 'number',\n method: 'string',\n target: '(string|element)'\n}\n\nconst EVENT_ACTIVATE = `activate${EVENT_KEY}`\nconst EVENT_SCROLL = `scroll${EVENT_KEY}`\nconst EVENT_LOAD_DATA_API = `load${EVENT_KEY}${DATA_API_KEY}`\n\nconst CLASS_NAME_DROPDOWN_ITEM = 'dropdown-item'\nconst CLASS_NAME_ACTIVE = 'active'\n\nconst SELECTOR_DATA_SPY = '[data-bs-spy=\"scroll\"]'\nconst SELECTOR_NAV_LIST_GROUP = '.nav, .list-group'\nconst SELECTOR_NAV_LINKS = '.nav-link'\nconst SELECTOR_NAV_ITEMS = '.nav-item'\nconst SELECTOR_LIST_ITEMS = '.list-group-item'\nconst SELECTOR_LINK_ITEMS = `${SELECTOR_NAV_LINKS}, ${SELECTOR_LIST_ITEMS}, .${CLASS_NAME_DROPDOWN_ITEM}`\nconst SELECTOR_DROPDOWN = '.dropdown'\nconst SELECTOR_DROPDOWN_TOGGLE = '.dropdown-toggle'\n\nconst METHOD_OFFSET = 'offset'\nconst METHOD_POSITION = 'position'\n\n/**\n * ------------------------------------------------------------------------\n * Class Definition\n * ------------------------------------------------------------------------\n */\n\nclass ScrollSpy extends BaseComponent {\n constructor(element, config) {\n super(element)\n this._scrollElement = this._element.tagName === 'BODY' ? window : this._element\n this._config = this._getConfig(config)\n this._offsets = []\n this._targets = []\n this._activeTarget = null\n this._scrollHeight = 0\n\n EventHandler.on(this._scrollElement, EVENT_SCROLL, () => this._process())\n\n this.refresh()\n this._process()\n }\n\n // Getters\n\n static get Default() {\n return Default\n }\n\n static get NAME() {\n return NAME\n }\n\n // Public\n\n refresh() {\n const autoMethod = this._scrollElement === this._scrollElement.window ?\n METHOD_OFFSET :\n METHOD_POSITION\n\n const offsetMethod = this._config.method === 'auto' ?\n autoMethod :\n this._config.method\n\n const offsetBase = offsetMethod === METHOD_POSITION ?\n this._getScrollTop() :\n 0\n\n this._offsets = []\n this._targets = []\n this._scrollHeight = this._getScrollHeight()\n\n const targets = SelectorEngine.find(SELECTOR_LINK_ITEMS, this._config.target)\n\n targets.map(element => {\n const targetSelector = getSelectorFromElement(element)\n const target = targetSelector ? SelectorEngine.findOne(targetSelector) : null\n\n if (target) {\n const targetBCR = target.getBoundingClientRect()\n if (targetBCR.width || targetBCR.height) {\n return [\n Manipulator[offsetMethod](target).top + offsetBase,\n targetSelector\n ]\n }\n }\n\n return null\n })\n .filter(item => item)\n .sort((a, b) => a[0] - b[0])\n .forEach(item => {\n this._offsets.push(item[0])\n this._targets.push(item[1])\n })\n }\n\n dispose() {\n EventHandler.off(this._scrollElement, EVENT_KEY)\n super.dispose()\n }\n\n // Private\n\n _getConfig(config) {\n config = {\n ...Default,\n ...Manipulator.getDataAttributes(this._element),\n ...(typeof config === 'object' && config ? config : {})\n }\n\n config.target = getElement(config.target) || document.documentElement\n\n typeCheckConfig(NAME, config, DefaultType)\n\n return config\n }\n\n _getScrollTop() {\n return this._scrollElement === window ?\n this._scrollElement.pageYOffset :\n this._scrollElement.scrollTop\n }\n\n _getScrollHeight() {\n return this._scrollElement.scrollHeight || Math.max(\n document.body.scrollHeight,\n document.documentElement.scrollHeight\n )\n }\n\n _getOffsetHeight() {\n return this._scrollElement === window ?\n window.innerHeight :\n this._scrollElement.getBoundingClientRect().height\n }\n\n _process() {\n const scrollTop = this._getScrollTop() + this._config.offset\n const scrollHeight = this._getScrollHeight()\n const maxScroll = this._config.offset + scrollHeight - this._getOffsetHeight()\n\n if (this._scrollHeight !== scrollHeight) {\n this.refresh()\n }\n\n if (scrollTop >= maxScroll) {\n const target = this._targets[this._targets.length - 1]\n\n if (this._activeTarget !== target) {\n this._activate(target)\n }\n\n return\n }\n\n if (this._activeTarget && scrollTop < this._offsets[0] && this._offsets[0] > 0) {\n this._activeTarget = null\n this._clear()\n return\n }\n\n for (let i = this._offsets.length; i--;) {\n const isActiveTarget = this._activeTarget !== this._targets[i] &&\n scrollTop >= this._offsets[i] &&\n (typeof this._offsets[i + 1] === 'undefined' || scrollTop < this._offsets[i + 1])\n\n if (isActiveTarget) {\n this._activate(this._targets[i])\n }\n }\n }\n\n _activate(target) {\n this._activeTarget = target\n\n this._clear()\n\n const queries = SELECTOR_LINK_ITEMS.split(',')\n .map(selector => `${selector}[data-bs-target=\"${target}\"],${selector}[href=\"${target}\"]`)\n\n const link = SelectorEngine.findOne(queries.join(','), this._config.target)\n\n link.classList.add(CLASS_NAME_ACTIVE)\n if (link.classList.contains(CLASS_NAME_DROPDOWN_ITEM)) {\n SelectorEngine.findOne(SELECTOR_DROPDOWN_TOGGLE, link.closest(SELECTOR_DROPDOWN))\n .classList.add(CLASS_NAME_ACTIVE)\n } else {\n SelectorEngine.parents(link, SELECTOR_NAV_LIST_GROUP)\n .forEach(listGroup => {\n // Set triggered links parents as active\n // With both
    and