diff --git a/DESCRIPTION b/DESCRIPTION index 4e9357aeec..f8ed2f9f1e 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -9,7 +9,7 @@ Imports: curl, xml2, jsonlite, rvest, stringi, tibble, dplyr, pdftools, data.tab License: GPL-3 Encoding: UTF-8 LazyData: true -RoxygenNote: 7.2.3 +RoxygenNote: 7.3.1 Suggests: knitr, rmarkdown, diff --git a/R/create_OSD.R b/R/create_OSD.R index 632abd92e8..b62de30059 100644 --- a/R/create_OSD.R +++ b/R/create_OSD.R @@ -1,413 +1,416 @@ -# Create OSD data structures in inst/extdata - -#' Create OSD Dataset -#' -#' @param ... not used -#' -#' @return TRUE if successful -#' @export -create_OSD <- function(...) { - - output_dir <- "inst/extdata/OSD" - logfile <- file.path(output_dir, "OSD.log") - - logmsg(logfile, "Processing OSD data snapshot from OSDRegistry...") - - attempt <- try({ - - logmsg(logfile, "Downloading snapshot...") - # Download OSDRegistry snapshot - download_OSD(url = 'https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip') - - # Do JSON parsing of sections - res <- osd_to_json(logfile = logfile, - output_dir = output_dir) - - if (!all(res)) - logmsg(logfile, "ERROR: One or more OSDs failed to parse to JSON!") - - unlink("OSD", recursive = TRUE) - - # Optional: special scripts can be called from inst/scripts/OSD - # rpath <- list.files("inst/scripts/OSD/", ".*.R", full.names = TRUE) - # - # # Find each .R file (one or more for each part) and source them - # lapply(rpath, function(filepath) { - # if (file.exists(filepath)) - # source(filepath) - # }) - - }) - - if (inherits(attempt, 'try-error')) - return(FALSE) - - logmsg(logfile, "Done!") - return(TRUE) -} - -#' Internal method for downloading OSDRegistry snapshot -#' -#' @description This is an internal method for downloading the latest snapshot (or sample ZIP) containing Official Series Description (OSD) text files in an alphabetical folder structure. These files are un-zipped and processed into JSON which is stored in \code{"inst/extdata/OSD"} -#' -#' @details Default path to OSD data snapshot is an "artifact" created by the \code{refresh-osd} workflow on the \href{https://github.com/ncss-tech/OSDRegistry}{OSDRegistry} GitHub Repository. -#' -#' The latest version of the snapshot can be downloaded as a ZIP file from this URL: \url{https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip}. -#' -#' Note: This is a ZIP file within a ZIP file where the internal ZIP file has a unique (weekly) date stamp. -#' -#' @param url Path to OSD Data Snapshot -#' @param ... Additional arguments to `curl::curl_download()` -#' @return TRUE if successful, try-error if download or parsing fails -#' @importFrom utils unzip -#' @importFrom curl curl_download -download_OSD <- function(url = NULL, ...) { - if (is.null(url)) - url <- 'https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip' - curl::curl_download(url, "OSD.zip", handle = .SKB_curl_handle(), ...) - unzip('OSD.zip') - file.remove('OSD.zip') - wkzip <- list.files(pattern = "OSD_.*zip") - unzip(wkzip) - file.remove(wkzip) - return(TRUE) -} - -#' Validate OSD using NSSH standards -#' -#' @param logfile Path to log file -#' @param filepath Path to a single plain text file containing OSD narrative -#' -#' @return A nested list containing OSD structure for specified file path -#' @export -#' @importFrom stringi stri_trans_general -validateOSD <- function(logfile, filepath) { - - if (!file.exists(filepath)) - return(FALSE) - - raw <- scan(file = filepath, - what = character(), - sep = "\n", quiet = TRUE) - - raw <- stringi::stri_trans_general(raw, "Latin-ASCII") - - raw <- trimws(raw[trimws(raw) != ""]) - - ser.raw.idx <- grep("SERIES$", raw)[1] - tax.raw.idx <- grep("TAXONOMIC CLASS[:]", raw)[1] - brief.desc.idx <- which(1:length(raw) > ser.raw.idx & - 1:length(raw) < tax.raw.idx) - - # capture any info between ALPHA SERIES and TAXONOMIC CLASS: - if (length(brief.desc.idx) > 0) { - brief.desc <- raw[brief.desc.idx] - raw <- raw[-brief.desc.idx] - } else { - brief.desc <- NA - } - - # this should be the last line in OSD - raw.max.idx <- grep("^U\\. ?S\\. ?A\\.$", raw) - - if (length(raw.max.idx) == 0) { - # if not present, take last line - raw.max.idx <- length(raw) - } else if (length(raw.max.idx) > 1) { - # this shouldnt happen (but it does) -- duplicated OSD contents e.g. HEDVILLE - logmsg(logfile, "DUPLICATE 'U.S.A.' END OF FILE MARKER: %s", filepath) - } - - # handle only first instance where OSD is duplicated, remove NCSS/U.S.A lines - raw <- raw[1:(raw.max.idx[1] - 1)] - if (raw[length(raw)] == "National Cooperative Soil Survey") { - raw <- raw[1:(length(raw) - 1)] - } - - # TODO: abstract and generalize these into rules - x <- trimws(raw[-grep("[A-Z '`][A-Z\\.'`]{2}[A-Z `']+.*|Ty[pic]+(al|fying)? ?[Pp]edon ?[:;\\-] ?.*|[A-Z]{3,}[:].*|\\(Colors are for", raw, invert = TRUE)]) - - if (length(x) != length(unique(x))) { - # x is all sorts of "headers" based on what the above pattern is allowed to match - # filter to just things that look like headers that would confuse the OSD parser - # sometimes this includes stuff in the RIC/REMARKS/ADDITIONAL DATA and may be "ok" - # though even OSDCheck/formatting is confused by such things (see HTML) - x.sub <- x[grepl("^[A-Z][A-Z \\(\\)]+:", x)] - if (length(x.sub) > 0 && length(x.sub) != length(unique(x.sub))) { - dh <- table(x.sub) - logmsg(logfile, "CHECK DUPLICATION OF HEADERS: %s [%s]", filepath, - paste0(names(dh)[which(dh > 1)], collapse = ",")) - } - } - - loc.idx <- grep("^LOCATION", x)[1] - ser.idx <- grep("SERIES$", x)[1] - lst.idx <- grep("SERIES ESTABLISHED[:]|SERIES PROPOSED[:]|ESTABLISHED SERIES[:]|PROPOSED SERIES[:]", x) - lst.idx <- lst.idx[length(lst.idx)] - - # allow the last section to be remarks, additional data or diagnostic horizons and other features recognized - rem.idx <- grep("REMARKS[:]|ADDITIONAL DATA[:]|DIAGNOSTIC HORIZONS AND OTHER FEATURES RECOGNIZED[:]|TABULAR SERIES DATA[:]", x) - rem.idx <- rem.idx[length(rem.idx)] - - if (length(rem.idx) == 0) { - rem.idx <- lst.idx - } - - # unable to locate location and series - if (is.na(loc.idx) | is.na(ser.idx) | length(x) == 0) { - logmsg(logfile, "CHECK LOCATION AND/OR SERIES: %s", filepath) - return(FALSE) - } - - if (length(rem.idx) == 0) { - # these have some sort of malformed series status - logmsg(logfile, "CHECK SECTION HEADINGS %s", filepath) - rem.idx <- length(x) - } - - # TODO: abstract and generalize these into rules - markers <- trimws(gsub("^([A-Z`']{2}[A-Z ().`']+[A-Za-z)`']{2}) ?[:;] ?.*|(USE): .*|(TY[PIC]+AL +PEDON)[ \\-]+.*|^(Ty[pic]+(al|fying) +[Pp]edon) ?[;:\\-]+.*", - "\\1\\2\\3\\4", - x[(ser.idx + 1):rem.idx])) - marker_self1 <- trimws(unlist(strsplit(gsub("LOCATION +([A-Z .`']+) {2,}\\d?([A-Z\\+]+)", "\\1;\\2", - x[loc.idx]), ";"))) - marker_self2 <- trimws(gsub("([A-Z .`']) SERIES", "\\1", x[ser.idx])) - - if (marker_self1[1] != marker_self2) { - logmsg(logfile, "CHECK LINE 1 LOCATION: %s", filepath) - - # TODO: abstract and generalize these into rules - # three series in California have established dates before the state - marker_self1[1] <- trimws(gsub("[0-9]|/", "", marker_self1[1])) - marker_self1 <- trimws(unlist(strsplit(gsub("LOCATION +([A-Z .`']+) {2,}\\d?([A-Z\\+]+)", "\\1;\\2", marker_self1[1]), ";"))) - - # inconsistent location and series - if (marker_self1[1] != marker_self2) - marker_self1[1] <- marker_self2 - } - - # TODO: abstract and generalize these into rules - # for now, just check that at least one valid state code is used (dput(datasets::state.abb)); check these against metadata - all_states <- c("AS","PB","PR","VI","HT","PW","FM", c("AL", "AK", "AZ", "AR", "CA", "CO", "CT", "DE", "FL", "GA", - "HI", "ID", "IL", "IN", "IA", "KS", "KY", "LA", "ME", "MD", "MA", - "MI", "MN", "MS", "MO", "MT", "NE", "NV", "NH", "NJ", "NM", "NY", - "NC", "ND", "OH", "OK", "OR", "PA", "RI", "SC", "SD", "TN", "TX", - "UT", "VT", "VA", "WA", "WV", "WI", "WY")) - n_states <- sum(unlist(lapply(all_states, function(x) sum(grepl(x, marker_self1[2]))))) - what_states <- paste0(unlist(sapply(all_states, function(x) x[grep(x, marker_self1[2])])), collapse = ",") - - if (n_states < 1) { - # This is not invoked, given list of state and territory codes - logmsg(logfile, "CHECK UNKNOWN STATE: %s", marker_self1[2]) - } - - # remove whole series name if used in header - markheaders <- trimws(gsub(paste0("\\b", marker_self2, "\\b"), "", markers)) - - # all section headers begin with capitals, and contain capitals up to the colon - bad.idx <- grep("[a-z1-9]", markheaders) - - # has typical pedon - typ.idx <- grep("ty[pic]+(al|fying) pedon", markheaders, ignore.case = TRUE) - if (length(typ.idx) > 0) { - if (any(typ.idx %in% bad.idx)) - bad.idx <- bad.idx[!(bad.idx %in% typ.idx)] - } - - # TODO: abstract and generalize these into rules - - # these are non-canonical headers (with colons) that should be collapsed within RIC, REMARKS, etc - bad.idx <- unique(c(bad.idx, grep("SAR|SLOPE|NAD83|MLRA[s(:]|NSTH 17|NOTES|NOTE", markheaders))) - - if (length(bad.idx) > 0) { - nu <- markheaders[-bad.idx] - tst <- unique(nu) - - if (length(tst) != length(nu)) { - logmsg(logfile, "CHECK DUPLICATE STANDARD SECTIONS: %s [%s]", filepath, - paste0(names(table(nu))[table(nu) > 1], collapse = ",")) - } - - markheaders <- tst - } - - # dput(markheaders[markheaders != ""]) - - # TODO: abstract and generalize these into rules - - headerpatterns <- c("TAXONOMIC CLASS", - "TY[PIC]+(AL|FYING)? ?PEDON|SOIL PROFILE|Soil Profile|Ty[pic]+(al|fying)? ?[Pp]edon|REFERENCE PEDON", - "TYPE LOCATION", - "RANGE IN CHARACTERISTICS|RANGE OF CHARACTERISTICS|RANGE OF INDIVIDUAL HORIZONS", - "COMPETING SERIES", - "GEOGRAPHICA?L? SETTINGS?|SETTING", - "ASSOCIATED SOILS", - "DRAINAGE AND (PERMEABILITY|SATURATED HYDRAULIC CONDUCTIVITY)|PERMEABILITY|DRAINAGE CLASS|DRAINAGE", - "USE AND VEGETATION|VEGETATION|USE", - "DISTRIBUTION AND EXTENT|DISTRIBUTION|EXTENT", - "SOIL SURVEY REGIONAL OFFICE", - "(SERIES )?(ESTABLISHED|PROPOSED)", - "REMARKS|DIAGNOSTIC HORIZONS AND OTHER FEATURES RECOGNIZED", - "ADDITIONAL DATA|TABULAR SERIES DATA") - - names(headerpatterns) <- c("TAXONOMIC CLASS", - "TYPICAL PEDON", - "TYPE LOCATION", - "RANGE IN CHARACTERISTICS", - "COMPETING SERIES", - "GEOGRAPHIC SETTING", - "GEOGRAPHICALLY ASSOCIATED SOILS", - "DRAINAGE AND PERMEABILITY", - "USE AND VEGETATION", - "DISTRIBUTION AND EXTENT", - "REGIONAL OFFICE", - "ORIGIN", - "REMARKS", - "ADDITIONAL DATA") - - headerorders <- sapply(1:length(headerpatterns), function(i) { - j <- grep(headerpatterns[i], markheaders) - if (length(j) == 0) - return(NA) - return(j) - }) - - rez <- do.call('list', lapply(1:length(headerorders), function(i) { - - parts <- headerorders[[i]] - - if (!all(grepl(headerpatterns[i], markheaders[parts]))) { - return(list(section = names(headerpatterns)[i], - content = NA)) - } - - if (length(parts) > 0) { - lpart <- lapply(seq_along(parts), function(pii) { - p <- parts[pii] - idx_start <- grep(pattern = markheaders[p], x = raw, fixed = TRUE) - - if (length(idx_start) > 1) { - idx_start <- idx_start[pii] - } - - if (length(idx_start) == 0 || is.na(idx_start)) { - idx_start <- grep(pattern = markheaders[p - 1], x = raw, fixed = TRUE) - } - - idx_next <- grep(markheaders[p + 1], raw, fixed = TRUE) - tag_next <- sort(as.numeric(sapply(headerpatterns[i:length(headerpatterns)], function(xx) { - y <- grep(xx, raw[idx_start:length(raw)], fixed = TRUE) + idx_start - 1 - return(y[length(y)]) - }))) - - idx_new <- pmin(ifelse(tag_next[1] > idx_start, tag_next[1], length(raw)), - idx_next[which(idx_next > idx_start)[1]] - 1, - length(raw), na.rm = TRUE)[1] - - idx_stop <- ifelse(test = (i == length(headerpatterns)), - yes = length(raw), - no = idx_new) - - # # : when and why do these get invoked? - if (length(idx_start) == 0 | length(idx_stop) == 0) { - logmsg(logfile, "DEBUG: idx_start/idx_stop have length 0") - return(list(section = markheaders[p], - content = NA)) - } - - if (is.na(idx_start) | is.na(idx_stop)) { - logmsg(logfile, "DEBUG: idx_start/idx_stop are NA") - return(list(section = markheaders[p], - content = NA)) - } - - if (names(headerpatterns)[i] == "TAXONOMIC CLASS" && - idx_stop < idx_start) { - idx_stop <- idx_start - } - - return(list(section = markheaders[p], - content = paste0(raw[unique(idx_start:idx_stop)], collapse = "\n"))) - }) - - # TODO: resolve duplication with unique() to hide exact duplicates (common c/p error) - lpartc <- Map('c', lpart) - - if (length(lpartc) > 0) - return(as.list(apply(do.call(rbind, lpartc), 2, paste, collapse = " & "))) - } - })) - - present_idx <- apply(sapply(headerpatterns, function(y) { - grepl(y, sapply(rez, function(x) x$section)) - }), 2, which) - - - names(rez) <- names(headerpatterns) - rez2 <- c(list(SERIES = marker_self2, - STATUS = raw[loc.idx + 1], - BYREV = raw[loc.idx + 2], - REVDATE = raw[loc.idx + 3], - STATES = what_states, - OVERVIEW = paste0(brief.desc, collapse = "\n")), - rez) - - rez2[is.na(names(rez2))] <- NULL - - return(rez2) -} - -#' Convert OSD plaintext to JSON using NSSH structural elements -#' -#' @param logfile Path to log file; default: \code{file.path(output_dir, "OSD/OSD.log")} -#' @param input_dir Default: \code{'OSD'}; files matching pattern are listed recursively -#' @param pattern Argument passed to \code{list.files} when \code{osd_files} is not specified -#' @param output_dir Default: \code{'inst/extdata'}; folder to create alphabetical folder structure with JSON files -#' @param osd_files Default \code{NULL}; Optional over-ride vector of file names for testing -#' -#' @return A logical vector equal in length to the number of input files. -#' @export -#' @importFrom jsonlite toJSON -osd_to_json <- function(logfile = file.path(output_dir, "OSD/OSD.log"), - input_dir = 'OSD', - pattern = "txt", - output_dir = "inst/extdata", - osd_files = NULL) { - - if (!is.null(osd_files)) { - all_osds <- osd_files - } else { - all_osds <- list.files(input_dir, pattern = pattern, - full.names = TRUE, recursive = TRUE) - } - - res <- sapply(1:length(all_osds), function(i) { - filepath <- all_osds[[i]] - logmsg(logfile, " - %s", filepath) - - x <- validateOSD(logfile, filepath) - - parsed.OSD <- .doParseOSD(x) - - # SPC-style components from parseOSD returned as nested data.frames in JSON - x$SITE <- I(list(parsed.OSD$`site-data`)) - x$HORIZONS <- I(list(parsed.OSD$`hz-data`)) - - if (is.logical(x)) - if (!x) return(FALSE) - - fld <- file.path(output_dir, substr(x$SERIES, 1, 1)) - - if (!dir.exists(fld)) - dir.create(fld, recursive = TRUE) - - fn <- gsub("\\.txt", "\\.json", basename(all_osds[[i]])) - - # note: all-NA columns are silently dropped by toJSON - # https://github.com/ncss-tech/SoilKnowledgeBase/issues/35 - write(jsonlite::toJSON(x, pretty = TRUE, auto_unbox = TRUE, na = 'string'), file = file.path(fld, fn)) - return(TRUE) - }) - names(res) <- all_osds - return(res) -} +# Create OSD data structures in inst/extdata + +#' Create OSD Dataset +#' +#' @param ... not used +#' @param download _logical_. Download OSD Snapshot from OSDRegistry? Default: `TRUE` +#' +#' @return TRUE if successful +#' @export +create_OSD <- function(..., download = TRUE) { + + output_dir <- "inst/extdata/OSD" + logfile <- file.path(output_dir, "OSD.log") + + logmsg(logfile, "Processing OSD data snapshot from OSDRegistry...") + + attempt <- try({ + + if (download) { + logmsg(logfile, "Downloading snapshot...") + # Download OSDRegistry snapshot + download_OSD(url = 'https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip') + } + + # Do JSON parsing of sections + res <- osd_to_json(logfile = logfile, + output_dir = output_dir) + + if (!all(res)) + logmsg(logfile, "ERROR: One or more OSDs failed to parse to JSON!") + + unlink("OSD", recursive = TRUE) + + # Optional: special scripts can be called from inst/scripts/OSD + # rpath <- list.files("inst/scripts/OSD/", ".*.R", full.names = TRUE) + # + # # Find each .R file (one or more for each part) and source them + # lapply(rpath, function(filepath) { + # if (file.exists(filepath)) + # source(filepath) + # }) + + }) + + if (inherits(attempt, 'try-error')) + return(FALSE) + + logmsg(logfile, "Done!") + return(TRUE) +} + +#' Internal method for downloading OSDRegistry snapshot +#' +#' @description This is an internal method for downloading the latest snapshot (or sample ZIP) containing Official Series Description (OSD) text files in an alphabetical folder structure. These files are un-zipped and processed into JSON which is stored in \code{"inst/extdata/OSD"} +#' +#' @details Default path to OSD data snapshot is an "artifact" created by the \code{refresh-osd} workflow on the \href{https://github.com/ncss-tech/OSDRegistry}{OSDRegistry} GitHub Repository. +#' +#' The latest version of the snapshot can be downloaded as a ZIP file from this URL: \url{https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip}. +#' +#' Note: This is a ZIP file within a ZIP file where the internal ZIP file has a unique (weekly) date stamp. +#' +#' @param url Path to OSD Data Snapshot +#' @param ... Additional arguments to `curl::curl_download()` +#' @return TRUE if successful, try-error if download or parsing fails +#' @importFrom utils unzip +#' @importFrom curl curl_download +download_OSD <- function(url = NULL, ...) { + if (is.null(url)) + url <- 'https://github.com/ncss-tech/OSDRegistry/releases/download/main/OSD-data-snapshot.zip' + curl::curl_download(url, "OSD.zip", handle = .SKB_curl_handle(), ...) + unzip('OSD.zip') + file.remove('OSD.zip') + wkzip <- list.files(pattern = "OSD_.*zip") + unzip(wkzip) + file.remove(wkzip) + return(TRUE) +} + +#' Validate OSD using NSSH standards +#' +#' @param logfile Path to log file +#' @param filepath Path to a single plain text file containing OSD narrative +#' +#' @return A nested list containing OSD structure for specified file path +#' @export +#' @importFrom stringi stri_trans_general +validateOSD <- function(logfile, filepath) { + + if (!file.exists(filepath)) + return(FALSE) + + raw <- scan(file = filepath, + what = character(), + sep = "\n", quiet = TRUE) + + raw <- stringi::stri_trans_general(raw, "Latin-ASCII") + + raw <- trimws(raw[trimws(raw) != ""]) + + ser.raw.idx <- grep("SERIES$", raw)[1] + tax.raw.idx <- grep("TAXONOMIC CLASS[:]", raw)[1] + brief.desc.idx <- which(1:length(raw) > ser.raw.idx & + 1:length(raw) < tax.raw.idx) + + # capture any info between ALPHA SERIES and TAXONOMIC CLASS: + if (length(brief.desc.idx) > 0) { + brief.desc <- raw[brief.desc.idx] + raw <- raw[-brief.desc.idx] + } else { + brief.desc <- NA + } + + # this should be the last line in OSD + raw.max.idx <- grep("^U\\. ?S\\. ?A\\.$", raw) + + if (length(raw.max.idx) == 0) { + # if not present, take last line + raw.max.idx <- length(raw) + } else if (length(raw.max.idx) > 1) { + # this shouldnt happen (but it does) -- duplicated OSD contents e.g. HEDVILLE + logmsg(logfile, "DUPLICATE 'U.S.A.' END OF FILE MARKER: %s", filepath) + } + + # handle only first instance where OSD is duplicated, remove NCSS/U.S.A lines + raw <- raw[1:(raw.max.idx[1] - 1)] + if (raw[length(raw)] == "National Cooperative Soil Survey") { + raw <- raw[1:(length(raw) - 1)] + } + + # TODO: abstract and generalize these into rules + x <- trimws(raw[-grep("[A-Z '`][A-Z\\.'`]{2}[A-Z `']+.*|Ty[pic]+(al|fying)? ?[Pp]edon ?[:;\\-] ?.*|[A-Z]{3,}[:].*|\\(Colors are for", raw, invert = TRUE)]) + + if (length(x) != length(unique(x))) { + # x is all sorts of "headers" based on what the above pattern is allowed to match + # filter to just things that look like headers that would confuse the OSD parser + # sometimes this includes stuff in the RIC/REMARKS/ADDITIONAL DATA and may be "ok" + # though even OSDCheck/formatting is confused by such things (see HTML) + x.sub <- x[grepl("^[A-Z][A-Z \\(\\)]+:", x)] + if (length(x.sub) > 0 && length(x.sub) != length(unique(x.sub))) { + dh <- table(x.sub) + logmsg(logfile, "CHECK DUPLICATION OF HEADERS: %s [%s]", filepath, + paste0(names(dh)[which(dh > 1)], collapse = ",")) + } + } + + loc.idx <- grep("^LOCATION", x)[1] + ser.idx <- grep("SERIES$", x)[1] + lst.idx <- grep("SERIES ESTABLISHED[:]|SERIES PROPOSED[:]|ESTABLISHED SERIES[:]|PROPOSED SERIES[:]", x) + lst.idx <- lst.idx[length(lst.idx)] + + # allow the last section to be remarks, additional data or diagnostic horizons and other features recognized + rem.idx <- grep("REMARKS[:]|ADDITIONAL DATA[:]|DIAGNOSTIC HORIZONS AND OTHER FEATURES RECOGNIZED[:]|TABULAR SERIES DATA[:]", x) + rem.idx <- rem.idx[length(rem.idx)] + + if (length(rem.idx) == 0) { + rem.idx <- lst.idx + } + + # unable to locate location and series + if (is.na(loc.idx) | is.na(ser.idx) | length(x) == 0) { + logmsg(logfile, "CHECK LOCATION AND/OR SERIES: %s", filepath) + return(FALSE) + } + + if (length(rem.idx) == 0) { + # these have some sort of malformed series status + logmsg(logfile, "CHECK SECTION HEADINGS %s", filepath) + rem.idx <- length(x) + } + + # TODO: abstract and generalize these into rules + markers <- trimws(gsub("^([A-Z`']{2}[A-Z ().`']+[A-Za-z)`']{2}) ?[:;] ?.*|(USE): .*|(TY[PIC]+AL +PEDON)[ \\-]+.*|^(Ty[pic]+(al|fying) +[Pp]edon) ?[;:\\-]+.*", + "\\1\\2\\3\\4", + x[(ser.idx + 1):rem.idx])) + marker_self1 <- trimws(unlist(strsplit(gsub("LOCATION +([A-Z .`']+) {2,}\\d?([A-Z\\+]+)", "\\1;\\2", + x[loc.idx]), ";"))) + marker_self2 <- trimws(gsub("([A-Z .`']) SERIES", "\\1", x[ser.idx])) + + if (marker_self1[1] != marker_self2) { + logmsg(logfile, "CHECK LINE 1 LOCATION: %s", filepath) + + # TODO: abstract and generalize these into rules + # three series in California have established dates before the state + marker_self1[1] <- trimws(gsub("[0-9]|/", "", marker_self1[1])) + marker_self1 <- trimws(unlist(strsplit(gsub("LOCATION +([A-Z .`']+) {2,}\\d?([A-Z\\+]+)", "\\1;\\2", marker_self1[1]), ";"))) + + # inconsistent location and series + if (marker_self1[1] != marker_self2) + marker_self1[1] <- marker_self2 + } + + # TODO: abstract and generalize these into rules + # for now, just check that at least one valid state code is used (dput(datasets::state.abb)); check these against metadata + all_states <- c("AS","PB","PR","VI","HT","PW","FM", c("AL", "AK", "AZ", "AR", "CA", "CO", "CT", "DE", "FL", "GA", + "HI", "ID", "IL", "IN", "IA", "KS", "KY", "LA", "ME", "MD", "MA", + "MI", "MN", "MS", "MO", "MT", "NE", "NV", "NH", "NJ", "NM", "NY", + "NC", "ND", "OH", "OK", "OR", "PA", "RI", "SC", "SD", "TN", "TX", + "UT", "VT", "VA", "WA", "WV", "WI", "WY")) + n_states <- sum(unlist(lapply(all_states, function(x) sum(grepl(x, marker_self1[2]))))) + what_states <- paste0(unlist(sapply(all_states, function(x) x[grep(x, marker_self1[2])])), collapse = ",") + + if (n_states < 1) { + # This is not invoked, given list of state and territory codes + logmsg(logfile, "CHECK UNKNOWN STATE: %s", marker_self1[2]) + } + + # remove whole series name if used in header + markheaders <- trimws(gsub(paste0("\\b", marker_self2, "\\b"), "", markers)) + + # all section headers begin with capitals, and contain capitals up to the colon + bad.idx <- grep("[a-z1-9]", markheaders) + + # has typical pedon + typ.idx <- grep("ty[pic]+(al|fying) pedon", markheaders, ignore.case = TRUE) + if (length(typ.idx) > 0) { + if (any(typ.idx %in% bad.idx)) + bad.idx <- bad.idx[!(bad.idx %in% typ.idx)] + } + + # TODO: abstract and generalize these into rules + + # these are non-canonical headers (with colons) that should be collapsed within RIC, REMARKS, etc + bad.idx <- unique(c(bad.idx, grep("SAR|SLOPE|NAD83|MLRA[s(:]|NSTH 17|NOTES|NOTE", markheaders))) + + if (length(bad.idx) > 0) { + nu <- markheaders[-bad.idx] + tst <- unique(nu) + + if (length(tst) != length(nu)) { + logmsg(logfile, "CHECK DUPLICATE STANDARD SECTIONS: %s [%s]", filepath, + paste0(names(table(nu))[table(nu) > 1], collapse = ",")) + } + + markheaders <- tst + } + + # dput(markheaders[markheaders != ""]) + + # TODO: abstract and generalize these into rules + + headerpatterns <- c("TAXONOMIC CLASS", + "TY[PIC]+(AL|FYING)? ?PEDON|SOIL PROFILE|Soil Profile|Ty[pic]+(al|fying)? ?[Pp]edon|REFERENCE PEDON", + "TYPE LOCATION", + "RANGE IN CHARACTERISTICS|RANGE OF CHARACTERISTICS|RANGE OF INDIVIDUAL HORIZONS", + "COMPETING SERIES", + "GEOGRAPHICA?L? SETTINGS?|SETTING", + "ASSOCIATED SOILS", + "DRAINAGE AND (PERMEABILITY|SATURATED HYDRAULIC CONDUCTIVITY)|PERMEABILITY|DRAINAGE CLASS|DRAINAGE", + "USE AND VEGETATION|VEGETATION|USE", + "DISTRIBUTION AND EXTENT|DISTRIBUTION|EXTENT", + "SOIL SURVEY REGIONAL OFFICE", + "(SERIES )?(ESTABLISHED|PROPOSED)", + "REMARKS|DIAGNOSTIC HORIZONS AND OTHER FEATURES RECOGNIZED", + "ADDITIONAL DATA|TABULAR SERIES DATA") + + names(headerpatterns) <- c("TAXONOMIC CLASS", + "TYPICAL PEDON", + "TYPE LOCATION", + "RANGE IN CHARACTERISTICS", + "COMPETING SERIES", + "GEOGRAPHIC SETTING", + "GEOGRAPHICALLY ASSOCIATED SOILS", + "DRAINAGE AND PERMEABILITY", + "USE AND VEGETATION", + "DISTRIBUTION AND EXTENT", + "REGIONAL OFFICE", + "ORIGIN", + "REMARKS", + "ADDITIONAL DATA") + + headerorders <- sapply(1:length(headerpatterns), function(i) { + j <- grep(headerpatterns[i], markheaders) + if (length(j) == 0) + return(NA) + return(j) + }) + + rez <- do.call('list', lapply(1:length(headerorders), function(i) { + + parts <- headerorders[[i]] + + if (!all(grepl(headerpatterns[i], markheaders[parts]))) { + return(list(section = names(headerpatterns)[i], + content = NA)) + } + + if (length(parts) > 0) { + lpart <- lapply(seq_along(parts), function(pii) { + p <- parts[pii] + idx_start <- grep(pattern = markheaders[p], x = raw, fixed = TRUE) + + if (length(idx_start) > 1) { + idx_start <- idx_start[pii] + } + + if (length(idx_start) == 0 || is.na(idx_start)) { + idx_start <- grep(pattern = markheaders[p - 1], x = raw, fixed = TRUE) + } + + idx_next <- grep(markheaders[p + 1], raw, fixed = TRUE) + tag_next <- sort(as.numeric(sapply(headerpatterns[i:length(headerpatterns)], function(xx) { + y <- grep(xx, raw[idx_start:length(raw)], fixed = TRUE) + idx_start - 1 + return(y[length(y)]) + }))) + + idx_new <- pmin(ifelse(tag_next[1] > idx_start, tag_next[1], length(raw)), + idx_next[which(idx_next > idx_start)[1]] - 1, + length(raw), na.rm = TRUE)[1] + + idx_stop <- ifelse(test = (i == length(headerpatterns)), + yes = length(raw), + no = idx_new) + + # # : when and why do these get invoked? + if (length(idx_start) == 0 | length(idx_stop) == 0) { + logmsg(logfile, "DEBUG: idx_start/idx_stop have length 0") + return(list(section = markheaders[p], + content = NA)) + } + + if (is.na(idx_start) | is.na(idx_stop)) { + logmsg(logfile, "DEBUG: idx_start/idx_stop are NA") + return(list(section = markheaders[p], + content = NA)) + } + + if (names(headerpatterns)[i] == "TAXONOMIC CLASS" && + idx_stop < idx_start) { + idx_stop <- idx_start + } + + return(list(section = markheaders[p], + content = paste0(raw[unique(idx_start:idx_stop)], collapse = "\n"))) + }) + + # TODO: resolve duplication with unique() to hide exact duplicates (common c/p error) + lpartc <- Map('c', lpart) + + if (length(lpartc) > 0) + return(as.list(apply(do.call(rbind, lpartc), 2, paste, collapse = " & "))) + } + })) + + present_idx <- apply(sapply(headerpatterns, function(y) { + grepl(y, sapply(rez, function(x) x$section)) + }), 2, which) + + + names(rez) <- names(headerpatterns) + rez2 <- c(list(SERIES = marker_self2, + STATUS = raw[loc.idx + 1], + BYREV = raw[loc.idx + 2], + REVDATE = raw[loc.idx + 3], + STATES = what_states, + OVERVIEW = paste0(brief.desc, collapse = "\n")), + rez) + + rez2[is.na(names(rez2))] <- NULL + + return(rez2) +} + +#' Convert OSD plaintext to JSON using NSSH structural elements +#' +#' @param logfile Path to log file; default: \code{file.path(output_dir, "OSD/OSD.log")} +#' @param input_dir Default: \code{'OSD'}; files matching pattern are listed recursively +#' @param pattern Argument passed to \code{list.files} when \code{osd_files} is not specified +#' @param output_dir Default: \code{'inst/extdata'}; folder to create alphabetical folder structure with JSON files +#' @param osd_files Default \code{NULL}; Optional over-ride vector of file names for testing +#' +#' @return A logical vector equal in length to the number of input files. +#' @export +#' @importFrom jsonlite toJSON +osd_to_json <- function(logfile = file.path(output_dir, "OSD/OSD.log"), + input_dir = 'OSD', + pattern = "txt", + output_dir = "inst/extdata", + osd_files = NULL) { + + if (!is.null(osd_files)) { + all_osds <- osd_files + } else { + all_osds <- list.files(input_dir, pattern = pattern, + full.names = TRUE, recursive = TRUE) + } + + res <- sapply(1:length(all_osds), function(i) { + filepath <- all_osds[[i]] + logmsg(logfile, " - %s", filepath) + + x <- validateOSD(logfile, filepath) + + parsed.OSD <- .doParseOSD(x) + + # SPC-style components from parseOSD returned as nested data.frames in JSON + x$SITE <- I(list(parsed.OSD$`site-data`)) + x$HORIZONS <- I(list(parsed.OSD$`hz-data`)) + + if (is.logical(x)) + if (!x) return(FALSE) + + fld <- file.path(output_dir, substr(x$SERIES, 1, 1)) + + if (!dir.exists(fld)) + dir.create(fld, recursive = TRUE) + + fn <- gsub("\\.txt", "\\.json", basename(all_osds[[i]])) + + # note: all-NA columns are silently dropped by toJSON + # https://github.com/ncss-tech/SoilKnowledgeBase/issues/35 + write(jsonlite::toJSON(x, pretty = TRUE, auto_unbox = TRUE, na = 'string'), file = file.path(fld, fn)) + return(TRUE) + }) + names(res) <- all_osds + return(res) +} diff --git a/R/parseOSD_functions.R b/R/parseOSD_functions.R index d3fc34f756..434eccdc0b 100644 --- a/R/parseOSD_functions.R +++ b/R/parseOSD_functions.R @@ -219,13 +219,18 @@ # drainage classes, in order, lower case classes <- c("excessively", "somewhat excessively", "well", "moderately well", "somewhat poorly", "poorly", "very poorly", "subaqueous") + class_hyphen <- gsub(" ", "[ \\-]", classes) # combine into capturing REGEX - classes.regex <- paste0('(', paste(classes, collapse = '|'), ')', "( (to|or|and) )?", - paste0('(', paste(classes, collapse = '|'), ')'), "? drained") + classes.regex <- paste0('(', paste(class_hyphen, collapse = '|'), ')', "([ \\-]drained)?( (to|or|and) )?", + paste0('(', paste(class_hyphen, collapse = '|'), ')'), + "?[ \\-]drained|subaqueous|Drainage[ class]*[:\\-]+ ", + '(', paste(class_hyphen, collapse = '|'), ')', "([ \\-]drained)?( (to|or|and) )?", + paste0('(', paste(class_hyphen, collapse = '|'), ')?')) # get matches m <- stringi::stri_match(text, regex = classes.regex, mode = 'first', opts_regex = list(case_insensitive = TRUE)) + m <- gsub("Drainage[ Cclass]*[:\\-]+ ", "", m, ignore.case = TRUE) # fail gracefully in the case of no section data or no matches if (nrow(m) < 1) { @@ -233,13 +238,22 @@ } # keep full match and convert to lower case, remove the word "drained" - m <- trimws(gsub("drained", "", tolower(m[, 1]))) - - # return as an ordered factor - # m <- factor(m, levels = classes, ordered = TRUE) - # factors cannot be preserved in JSON output, and wont work for multiple classes/ranges of classes + m <- trimws(gsub(" ", " ", gsub("-", " ", gsub("drained", "", tolower(m[, 1]))))) + + # put classes in order from excessively->subaqueous + # interpolate ranges across more than 2 classes, and concatenate with comma + m2 <- strsplit(m, "\\b(and|or|to)\\b") + m3 <- lapply(m2, function(x) { + x <- trimws(x) + y <- as.integer(factor(unique(classes[match(x, classes)]), + levels = classes, ordered = TRUE)) + if (length(y) > 1) { + y <- seq(from = min(y, na.rm = TRUE), to = max(y, na.rm = TRUE)) + } + ifelse(is.na(classes[y]), "", classes[y]) # TODO: use zero chars or NA? + }) - return(m) + return(sapply(m3, paste0, collapse = ", ")) } .zerochar_to_na <- function(x) { diff --git a/inst/extdata/OSD/A/AABERG.json b/inst/extdata/OSD/A/AABERG.json index ea6d0ebcc7..3b1366c3ab 100644 --- a/inst/extdata/OSD/A/AABERG.json +++ b/inst/extdata/OSD/A/AABERG.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ABAC.json b/inst/extdata/OSD/A/ABAC.json index 1d0a9e8051..14a3d5ed5e 100644 --- a/inst/extdata/OSD/A/ABAC.json +++ b/inst/extdata/OSD/A/ABAC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABAJO.json b/inst/extdata/OSD/A/ABAJO.json index 964ede7ce1..40c52ee29d 100644 --- a/inst/extdata/OSD/A/ABAJO.json +++ b/inst/extdata/OSD/A/ABAJO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABALAN.json b/inst/extdata/OSD/A/ABALAN.json index 8f6754526a..a300655d6b 100644 --- a/inst/extdata/OSD/A/ABALAN.json +++ b/inst/extdata/OSD/A/ABALAN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/A/ABERONE.json b/inst/extdata/OSD/A/ABERONE.json index 850cfb9020..07954f9265 100644 --- a/inst/extdata/OSD/A/ABERONE.json +++ b/inst/extdata/OSD/A/ABERONE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively or well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABGESE.json b/inst/extdata/OSD/A/ABGESE.json index a90cbe6dce..0f383ded25 100644 --- a/inst/extdata/OSD/A/ABGESE.json +++ b/inst/extdata/OSD/A/ABGESE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABIQUA.json b/inst/extdata/OSD/A/ABIQUA.json index 4cd4f3e0bd..410bbd7def 100644 --- a/inst/extdata/OSD/A/ABIQUA.json +++ b/inst/extdata/OSD/A/ABIQUA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABREU.json b/inst/extdata/OSD/A/ABREU.json index e46c466f07..cb45d00608 100644 --- a/inst/extdata/OSD/A/ABREU.json +++ b/inst/extdata/OSD/A/ABREU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ABSHER.json b/inst/extdata/OSD/A/ABSHER.json index 93db9f4064..f533782e24 100644 --- a/inst/extdata/OSD/A/ABSHER.json +++ b/inst/extdata/OSD/A/ABSHER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ACADEMY.json b/inst/extdata/OSD/A/ACADEMY.json index 26840372c4..2232cbb62d 100644 --- a/inst/extdata/OSD/A/ACADEMY.json +++ b/inst/extdata/OSD/A/ACADEMY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ACO.json b/inst/extdata/OSD/A/ACO.json index fa360e2fac..33110a06ee 100644 --- a/inst/extdata/OSD/A/ACO.json +++ b/inst/extdata/OSD/A/ACO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/ADAMS.json b/inst/extdata/OSD/A/ADAMS.json index 2d0da9944c..38bd70a8e8 100644 --- a/inst/extdata/OSD/A/ADAMS.json +++ b/inst/extdata/OSD/A/ADAMS.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "excessively and somewhat excessively" + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/A/ADGER.json b/inst/extdata/OSD/A/ADGER.json index 2c1cdef6d6..d06feff193 100644 --- a/inst/extdata/OSD/A/ADGER.json +++ b/inst/extdata/OSD/A/ADGER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ADILIS.json b/inst/extdata/OSD/A/ADILIS.json index 5022819090..c9bedba73c 100644 --- a/inst/extdata/OSD/A/ADILIS.json +++ b/inst/extdata/OSD/A/ADILIS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ADJIDAUMO.json b/inst/extdata/OSD/A/ADJIDAUMO.json index cd92e3e0a0..9e78c026a9 100644 --- a/inst/extdata/OSD/A/ADJIDAUMO.json +++ b/inst/extdata/OSD/A/ADJIDAUMO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ADOLPH.json b/inst/extdata/OSD/A/ADOLPH.json index 9edba67939..f2272c660e 100644 --- a/inst/extdata/OSD/A/ADOLPH.json +++ b/inst/extdata/OSD/A/ADOLPH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/AGER.json b/inst/extdata/OSD/A/AGER.json index 35167169a7..184adae54e 100644 --- a/inst/extdata/OSD/A/AGER.json +++ b/inst/extdata/OSD/A/AGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/AGUA_DULCE.json b/inst/extdata/OSD/A/AGUA_DULCE.json index 73be98eeb4..d61b87afee 100644 --- a/inst/extdata/OSD/A/AGUA_DULCE.json +++ b/inst/extdata/OSD/A/AGUA_DULCE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/AGUEDA.json b/inst/extdata/OSD/A/AGUEDA.json index ca1ceb2c4d..04c484dac3 100644 --- a/inst/extdata/OSD/A/AGUEDA.json +++ b/inst/extdata/OSD/A/AGUEDA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/AHL.json b/inst/extdata/OSD/A/AHL.json index b7a26a5ec2..a0c650bb53 100644 --- a/inst/extdata/OSD/A/AHL.json +++ b/inst/extdata/OSD/A/AHL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/AILEY.json b/inst/extdata/OSD/A/AILEY.json index 19e66330f0..b6c2d5a1db 100644 --- a/inst/extdata/OSD/A/AILEY.json +++ b/inst/extdata/OSD/A/AILEY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/AINAHOU.json b/inst/extdata/OSD/A/AINAHOU.json index 90a44d5976..877468e414 100644 --- a/inst/extdata/OSD/A/AINAHOU.json +++ b/inst/extdata/OSD/A/AINAHOU.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/AKAN.json b/inst/extdata/OSD/A/AKAN.json index d6da119335..b8dbd2dcaa 100644 --- a/inst/extdata/OSD/A/AKAN.json +++ b/inst/extdata/OSD/A/AKAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALAMOSA.json b/inst/extdata/OSD/A/ALAMOSA.json index 64568aa16d..9894080747 100644 --- a/inst/extdata/OSD/A/ALAMOSA.json +++ b/inst/extdata/OSD/A/ALAMOSA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALANTHUS.json b/inst/extdata/OSD/A/ALANTHUS.json index c13abb7604..93f05e46a6 100644 --- a/inst/extdata/OSD/A/ALANTHUS.json +++ b/inst/extdata/OSD/A/ALANTHUS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/A/ALBATON.json b/inst/extdata/OSD/A/ALBATON.json index 4fe0f1f2bc..221433e8e8 100644 --- a/inst/extdata/OSD/A/ALBATON.json +++ b/inst/extdata/OSD/A/ALBATON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALBINAS.json b/inst/extdata/OSD/A/ALBINAS.json index 0aabc7935e..9908fa181a 100644 --- a/inst/extdata/OSD/A/ALBINAS.json +++ b/inst/extdata/OSD/A/ALBINAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALBION.json b/inst/extdata/OSD/A/ALBION.json index cb5cc7a09f..57745c067d 100644 --- a/inst/extdata/OSD/A/ALBION.json +++ b/inst/extdata/OSD/A/ALBION.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/ALBRIGHTS.json b/inst/extdata/OSD/A/ALBRIGHTS.json index 52eaed5c5b..fc3d6de6eb 100644 --- a/inst/extdata/OSD/A/ALBRIGHTS.json +++ b/inst/extdata/OSD/A/ALBRIGHTS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALCESTER.json b/inst/extdata/OSD/A/ALCESTER.json index de79cfe84e..e47f66b437 100644 --- a/inst/extdata/OSD/A/ALCESTER.json +++ b/inst/extdata/OSD/A/ALCESTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ALDA.json b/inst/extdata/OSD/A/ALDA.json index 6c1a0759a2..358af4c1a8 100644 --- a/inst/extdata/OSD/A/ALDA.json +++ b/inst/extdata/OSD/A/ALDA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALDERMAND.json b/inst/extdata/OSD/A/ALDERMAND.json index 7e4889c10b..11b0b1aae6 100644 --- a/inst/extdata/OSD/A/ALDERMAND.json +++ b/inst/extdata/OSD/A/ALDERMAND.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/A/ALET.json b/inst/extdata/OSD/A/ALET.json index 07935cefe9..62a4b35705 100644 --- a/inst/extdata/OSD/A/ALET.json +++ b/inst/extdata/OSD/A/ALET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALGERITA.json b/inst/extdata/OSD/A/ALGERITA.json index d549506413..acc27bc031 100644 --- a/inst/extdata/OSD/A/ALGERITA.json +++ b/inst/extdata/OSD/A/ALGERITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALICE.json b/inst/extdata/OSD/A/ALICE.json index 72c1294034..983f65b51b 100644 --- a/inst/extdata/OSD/A/ALICE.json +++ b/inst/extdata/OSD/A/ALICE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALLANTON.json b/inst/extdata/OSD/A/ALLANTON.json index f525199547..2169c94e88 100644 --- a/inst/extdata/OSD/A/ALLANTON.json +++ b/inst/extdata/OSD/A/ALLANTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALLENTINE.json b/inst/extdata/OSD/A/ALLENTINE.json index 70ab81a9ff..48ab8c890b 100644 --- a/inst/extdata/OSD/A/ALLENTINE.json +++ b/inst/extdata/OSD/A/ALLENTINE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/A/ALLIANCE.json b/inst/extdata/OSD/A/ALLIANCE.json index e27b758b3b..6959f7c417 100644 --- a/inst/extdata/OSD/A/ALLIANCE.json +++ b/inst/extdata/OSD/A/ALLIANCE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALLISON.json b/inst/extdata/OSD/A/ALLISON.json index fffc8a3fb7..db9d855d61 100644 --- a/inst/extdata/OSD/A/ALLISON.json +++ b/inst/extdata/OSD/A/ALLISON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ALMERIA.json b/inst/extdata/OSD/A/ALMERIA.json index 0be63b3c47..32a1768af0 100644 --- a/inst/extdata/OSD/A/ALMERIA.json +++ b/inst/extdata/OSD/A/ALMERIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALMONT.json b/inst/extdata/OSD/A/ALMONT.json index f544012074..9e3c5fe303 100644 --- a/inst/extdata/OSD/A/ALMONT.json +++ b/inst/extdata/OSD/A/ALMONT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALO.json b/inst/extdata/OSD/A/ALO.json index 85cfb8b818..384d3aa03a 100644 --- a/inst/extdata/OSD/A/ALO.json +++ b/inst/extdata/OSD/A/ALO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALOVAR.json b/inst/extdata/OSD/A/ALOVAR.json index 063f1ecd35..cd9806f930 100644 --- a/inst/extdata/OSD/A/ALOVAR.json +++ b/inst/extdata/OSD/A/ALOVAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALPON.json b/inst/extdata/OSD/A/ALPON.json index e3827d7a22..2368a7bd74 100644 --- a/inst/extdata/OSD/A/ALPON.json +++ b/inst/extdata/OSD/A/ALPON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALTAZANO.json b/inst/extdata/OSD/A/ALTAZANO.json index ea49227f03..bf349254ce 100644 --- a/inst/extdata/OSD/A/ALTAZANO.json +++ b/inst/extdata/OSD/A/ALTAZANO.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/ALTICREST.json b/inst/extdata/OSD/A/ALTICREST.json index 10afb83db7..f3b201d3bb 100644 --- a/inst/extdata/OSD/A/ALTICREST.json +++ b/inst/extdata/OSD/A/ALTICREST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALTMAR.json b/inst/extdata/OSD/A/ALTMAR.json index 926f2b0fbb..46b6fe7cf1 100644 --- a/inst/extdata/OSD/A/ALTMAR.json +++ b/inst/extdata/OSD/A/ALTMAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ALTOGA.json b/inst/extdata/OSD/A/ALTOGA.json index a4333b4803..152514fb5e 100644 --- a/inst/extdata/OSD/A/ALTOGA.json +++ b/inst/extdata/OSD/A/ALTOGA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ALTON.json b/inst/extdata/OSD/A/ALTON.json index 01b6cc478a..70b92a282c 100644 --- a/inst/extdata/OSD/A/ALTON.json +++ b/inst/extdata/OSD/A/ALTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/ALTURAS.json b/inst/extdata/OSD/A/ALTURAS.json index ef367fb93d..95f5b93d01 100644 --- a/inst/extdata/OSD/A/ALTURAS.json +++ b/inst/extdata/OSD/A/ALTURAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ALVODEST.json b/inst/extdata/OSD/A/ALVODEST.json index 498eafe37b..f1f6c9f0ad 100644 --- a/inst/extdata/OSD/A/ALVODEST.json +++ b/inst/extdata/OSD/A/ALVODEST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly to moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/AMARADA.json b/inst/extdata/OSD/A/AMARADA.json index a273259a63..32aaa06182 100644 --- a/inst/extdata/OSD/A/AMARADA.json +++ b/inst/extdata/OSD/A/AMARADA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/A/AMASA.json b/inst/extdata/OSD/A/AMASA.json index dcbc027ea4..7818950ab5 100644 --- a/inst/extdata/OSD/A/AMASA.json +++ b/inst/extdata/OSD/A/AMASA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/AMES.json b/inst/extdata/OSD/A/AMES.json index 559764310c..6e1f912452 100644 --- a/inst/extdata/OSD/A/AMES.json +++ b/inst/extdata/OSD/A/AMES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/AMTOFT.json b/inst/extdata/OSD/A/AMTOFT.json index 7ff1d2b7e4..3071129c74 100644 --- a/inst/extdata/OSD/A/AMTOFT.json +++ b/inst/extdata/OSD/A/AMTOFT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/AMWELL.json b/inst/extdata/OSD/A/AMWELL.json index a84564b5ec..0069b10912 100644 --- a/inst/extdata/OSD/A/AMWELL.json +++ b/inst/extdata/OSD/A/AMWELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANAHEIM.json b/inst/extdata/OSD/A/ANAHEIM.json index 9dab9f4450..c65f4a390c 100644 --- a/inst/extdata/OSD/A/ANAHEIM.json +++ b/inst/extdata/OSD/A/ANAHEIM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/A/ANAN.json b/inst/extdata/OSD/A/ANAN.json index 57b8a6f8e5..395972153b 100644 --- a/inst/extdata/OSD/A/ANAN.json +++ b/inst/extdata/OSD/A/ANAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANCHO.json b/inst/extdata/OSD/A/ANCHO.json index 27abf00f67..60a6dc9a27 100644 --- a/inst/extdata/OSD/A/ANCHO.json +++ b/inst/extdata/OSD/A/ANCHO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ANDERS.json b/inst/extdata/OSD/A/ANDERS.json index 13b91b436a..d937403daa 100644 --- a/inst/extdata/OSD/A/ANDERS.json +++ b/inst/extdata/OSD/A/ANDERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ANGELICA.json b/inst/extdata/OSD/A/ANGELICA.json index 45cc7335da..87e7afcdaf 100644 --- a/inst/extdata/OSD/A/ANGELICA.json +++ b/inst/extdata/OSD/A/ANGELICA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANGUILLA.json b/inst/extdata/OSD/A/ANGUILLA.json index 84ebad94fd..5b6a7b8c34 100644 --- a/inst/extdata/OSD/A/ANGUILLA.json +++ b/inst/extdata/OSD/A/ANGUILLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/A/ANKONA.json b/inst/extdata/OSD/A/ANKONA.json index 65bbaaa781..b4727ef162 100644 --- a/inst/extdata/OSD/A/ANKONA.json +++ b/inst/extdata/OSD/A/ANKONA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANNRIVER.json b/inst/extdata/OSD/A/ANNRIVER.json index 2e8b7f9a9e..65493b07f8 100644 --- a/inst/extdata/OSD/A/ANNRIVER.json +++ b/inst/extdata/OSD/A/ANNRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANTERO.json b/inst/extdata/OSD/A/ANTERO.json index c3355e574f..8ac6bd4892 100644 --- a/inst/extdata/OSD/A/ANTERO.json +++ b/inst/extdata/OSD/A/ANTERO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANTILON.json b/inst/extdata/OSD/A/ANTILON.json index 70e13cd332..27ba417072 100644 --- a/inst/extdata/OSD/A/ANTILON.json +++ b/inst/extdata/OSD/A/ANTILON.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly and moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ANTIOCH.json b/inst/extdata/OSD/A/ANTIOCH.json index 694620ce00..45aa715047 100644 --- a/inst/extdata/OSD/A/ANTIOCH.json +++ b/inst/extdata/OSD/A/ANTIOCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ANTY.json b/inst/extdata/OSD/A/ANTY.json index b55d8e1fbe..e4928b1926 100644 --- a/inst/extdata/OSD/A/ANTY.json +++ b/inst/extdata/OSD/A/ANTY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ANT_FLAT.json b/inst/extdata/OSD/A/ANT_FLAT.json index 53a9118d6b..5320b682ca 100644 --- a/inst/extdata/OSD/A/ANT_FLAT.json +++ b/inst/extdata/OSD/A/ANT_FLAT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ANWAY.json b/inst/extdata/OSD/A/ANWAY.json index de62be490d..f060890a06 100644 --- a/inst/extdata/OSD/A/ANWAY.json +++ b/inst/extdata/OSD/A/ANWAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ANZA.json b/inst/extdata/OSD/A/ANZA.json index 9f6b3c4135..01dfa486f7 100644 --- a/inst/extdata/OSD/A/ANZA.json +++ b/inst/extdata/OSD/A/ANZA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/A/AOWA.json b/inst/extdata/OSD/A/AOWA.json index dc83aa4bd1..aa9b8d4048 100644 --- a/inst/extdata/OSD/A/AOWA.json +++ b/inst/extdata/OSD/A/AOWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/APISHAPA.json b/inst/extdata/OSD/A/APISHAPA.json index 8ff9ee6487..301873f02f 100644 --- a/inst/extdata/OSD/A/APISHAPA.json +++ b/inst/extdata/OSD/A/APISHAPA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/A/AQUAPAUG.json b/inst/extdata/OSD/A/AQUAPAUG.json index d2bc4559a4..6f7da15976 100644 --- a/inst/extdata/OSD/A/AQUAPAUG.json +++ b/inst/extdata/OSD/A/AQUAPAUG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/A/ARAPIEN.json b/inst/extdata/OSD/A/ARAPIEN.json index e29a8e7934..8cc765f3de 100644 --- a/inst/extdata/OSD/A/ARAPIEN.json +++ b/inst/extdata/OSD/A/ARAPIEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARBOLADO.json b/inst/extdata/OSD/A/ARBOLADO.json index cf8e5c643f..2636ef8a82 100644 --- a/inst/extdata/OSD/A/ARBOLADO.json +++ b/inst/extdata/OSD/A/ARBOLADO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARCHES.json b/inst/extdata/OSD/A/ARCHES.json index 0a1d60b723..e59ff21a84 100644 --- a/inst/extdata/OSD/A/ARCHES.json +++ b/inst/extdata/OSD/A/ARCHES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/A/ARCTANDER.json b/inst/extdata/OSD/A/ARCTANDER.json index d7acd5bae4..914e870c8e 100644 --- a/inst/extdata/OSD/A/ARCTANDER.json +++ b/inst/extdata/OSD/A/ARCTANDER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/A/ARD.json b/inst/extdata/OSD/A/ARD.json index f8dc374e56..e2456dc140 100644 --- a/inst/extdata/OSD/A/ARD.json +++ b/inst/extdata/OSD/A/ARD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARDTOO.json b/inst/extdata/OSD/A/ARDTOO.json index 626dd4f6af..51679c7b17 100644 --- a/inst/extdata/OSD/A/ARDTOO.json +++ b/inst/extdata/OSD/A/ARDTOO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARGENT.json b/inst/extdata/OSD/A/ARGENT.json index d4d280060f..a04021d9c8 100644 --- a/inst/extdata/OSD/A/ARGENT.json +++ b/inst/extdata/OSD/A/ARGENT.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly or very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ARIS.json b/inst/extdata/OSD/A/ARIS.json index f7f12e366b..3ea344f150 100644 --- a/inst/extdata/OSD/A/ARIS.json +++ b/inst/extdata/OSD/A/ARIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/A/ARLINGTON.json b/inst/extdata/OSD/A/ARLINGTON.json index 3007e444c9..69cf5fe7de 100644 --- a/inst/extdata/OSD/A/ARLINGTON.json +++ b/inst/extdata/OSD/A/ARLINGTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ARLO.json b/inst/extdata/OSD/A/ARLO.json index dfb51fe6a9..804fa863fb 100644 --- a/inst/extdata/OSD/A/ARLO.json +++ b/inst/extdata/OSD/A/ARLO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ARNEGARD.json b/inst/extdata/OSD/A/ARNEGARD.json index 5cacba689f..4ef9e7f2c5 100644 --- a/inst/extdata/OSD/A/ARNEGARD.json +++ b/inst/extdata/OSD/A/ARNEGARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/ARNOT.json b/inst/extdata/OSD/A/ARNOT.json index 075752275d..48d67ee1de 100644 --- a/inst/extdata/OSD/A/ARNOT.json +++ b/inst/extdata/OSD/A/ARNOT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively to moderately well" + "drainage": "somewhat excessively, well, moderately well", + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/AROSA.json b/inst/extdata/OSD/A/AROSA.json index b256250abc..98cee25a4a 100644 --- a/inst/extdata/OSD/A/AROSA.json +++ b/inst/extdata/OSD/A/AROSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARP.json b/inst/extdata/OSD/A/ARP.json index 46e7efa029..4edbda756c 100644 --- a/inst/extdata/OSD/A/ARP.json +++ b/inst/extdata/OSD/A/ARP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ARROYO_SECO.json b/inst/extdata/OSD/A/ARROYO_SECO.json index 3722fdf0a4..52b810ff13 100644 --- a/inst/extdata/OSD/A/ARROYO_SECO.json +++ b/inst/extdata/OSD/A/ARROYO_SECO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/A/ARTESIAN.json b/inst/extdata/OSD/A/ARTESIAN.json index 437ef041fc..554d38a221 100644 --- a/inst/extdata/OSD/A/ARTESIAN.json +++ b/inst/extdata/OSD/A/ARTESIAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/ARVESON.json b/inst/extdata/OSD/A/ARVESON.json index 168ded8909..fdfe1fc4dc 100644 --- a/inst/extdata/OSD/A/ARVESON.json +++ b/inst/extdata/OSD/A/ARVESON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ASHDOWN.json b/inst/extdata/OSD/A/ASHDOWN.json index c6a10b1c28..8ea755f072 100644 --- a/inst/extdata/OSD/A/ASHDOWN.json +++ b/inst/extdata/OSD/A/ASHDOWN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ASHLAR.json b/inst/extdata/OSD/A/ASHLAR.json index bbd2385e03..524fb2d991 100644 --- a/inst/extdata/OSD/A/ASHLAR.json +++ b/inst/extdata/OSD/A/ASHLAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/A/ASHUE.json b/inst/extdata/OSD/A/ASHUE.json index c6d2a0eb69..8fd02d3199 100644 --- a/inst/extdata/OSD/A/ASHUE.json +++ b/inst/extdata/OSD/A/ASHUE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ASHWORTH.json b/inst/extdata/OSD/A/ASHWORTH.json index e849e17aac..a6118b717a 100644 --- a/inst/extdata/OSD/A/ASHWORTH.json +++ b/inst/extdata/OSD/A/ASHWORTH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ATASCOSA.json b/inst/extdata/OSD/A/ATASCOSA.json index 8b4748a4e8..c5f27f8cf3 100644 --- a/inst/extdata/OSD/A/ATASCOSA.json +++ b/inst/extdata/OSD/A/ATASCOSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/ATHERTON.json b/inst/extdata/OSD/A/ATHERTON.json index 3b78b4c4e7..8e4c88c1f5 100644 --- a/inst/extdata/OSD/A/ATHERTON.json +++ b/inst/extdata/OSD/A/ATHERTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/ATOKA.json b/inst/extdata/OSD/A/ATOKA.json index 670273209a..54e7df2b76 100644 --- a/inst/extdata/OSD/A/ATOKA.json +++ b/inst/extdata/OSD/A/ATOKA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/AUGSBURG.json b/inst/extdata/OSD/A/AUGSBURG.json index b92decc5f7..8b25fbc386 100644 --- a/inst/extdata/OSD/A/AUGSBURG.json +++ b/inst/extdata/OSD/A/AUGSBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/A/AUSMUS.json b/inst/extdata/OSD/A/AUSMUS.json index 54baf7070d..c718a4e694 100644 --- a/inst/extdata/OSD/A/AUSMUS.json +++ b/inst/extdata/OSD/A/AUSMUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/A/AUSTIN.json b/inst/extdata/OSD/A/AUSTIN.json index 312f37c9d3..9982c17ed1 100644 --- a/inst/extdata/OSD/A/AUSTIN.json +++ b/inst/extdata/OSD/A/AUSTIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/A/AUSTWELL.json b/inst/extdata/OSD/A/AUSTWELL.json index 49cec2f83a..57ede37271 100644 --- a/inst/extdata/OSD/A/AUSTWELL.json +++ b/inst/extdata/OSD/A/AUSTWELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/A/AUTOMBA.json b/inst/extdata/OSD/A/AUTOMBA.json index fb96b9e6a4..9431d216ae 100644 --- a/inst/extdata/OSD/A/AUTOMBA.json +++ b/inst/extdata/OSD/A/AUTOMBA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/A/AXTELL.json b/inst/extdata/OSD/A/AXTELL.json index 55e86ca3c7..b2be35c202 100644 --- a/inst/extdata/OSD/A/AXTELL.json +++ b/inst/extdata/OSD/A/AXTELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/A/AYERSVILLE.json b/inst/extdata/OSD/A/AYERSVILLE.json index 179dc5d087..11e4145306 100644 --- a/inst/extdata/OSD/A/AYERSVILLE.json +++ b/inst/extdata/OSD/A/AYERSVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BACH.json b/inst/extdata/OSD/B/BACH.json index b6952f4c2a..c1844c92e8 100644 --- a/inst/extdata/OSD/B/BACH.json +++ b/inst/extdata/OSD/B/BACH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BACID.json b/inst/extdata/OSD/B/BACID.json index 6cc0419658..c7b46094ae 100644 --- a/inst/extdata/OSD/B/BACID.json +++ b/inst/extdata/OSD/B/BACID.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BADGERPASS.json b/inst/extdata/OSD/B/BADGERPASS.json index af067e66e0..27561013af 100644 --- a/inst/extdata/OSD/B/BADGERPASS.json +++ b/inst/extdata/OSD/B/BADGERPASS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively", + "drainage": "excessively, somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/B/BADRIVER.json b/inst/extdata/OSD/B/BADRIVER.json index 1ad0050a4f..810d6d9fa7 100644 --- a/inst/extdata/OSD/B/BADRIVER.json +++ b/inst/extdata/OSD/B/BADRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BADUS.json b/inst/extdata/OSD/B/BADUS.json index 7b6f2cd4f2..8adedad871 100644 --- a/inst/extdata/OSD/B/BADUS.json +++ b/inst/extdata/OSD/B/BADUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BAFFIN.json b/inst/extdata/OSD/B/BAFFIN.json index b95a2b874e..fceaf72db1 100644 --- a/inst/extdata/OSD/B/BAFFIN.json +++ b/inst/extdata/OSD/B/BAFFIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BAGARD.json b/inst/extdata/OSD/B/BAGARD.json index 3d7fd6f8af..bfc1859cf4 100644 --- a/inst/extdata/OSD/B/BAGARD.json +++ b/inst/extdata/OSD/B/BAGARD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BAGAUL.json b/inst/extdata/OSD/B/BAGAUL.json index 881d153e4a..0f08507dc6 100644 --- a/inst/extdata/OSD/B/BAGAUL.json +++ b/inst/extdata/OSD/B/BAGAUL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BAGVAL.json b/inst/extdata/OSD/B/BAGVAL.json index f06275ce3d..61807bb9d9 100644 --- a/inst/extdata/OSD/B/BAGVAL.json +++ b/inst/extdata/OSD/B/BAGVAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BAILEY.json b/inst/extdata/OSD/B/BAILEY.json index 6e4a83e83c..896cd48ff8 100644 --- a/inst/extdata/OSD/B/BAILEY.json +++ b/inst/extdata/OSD/B/BAILEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALDY.json b/inst/extdata/OSD/B/BALDY.json index 1bca70de4e..bc1a438ac6 100644 --- a/inst/extdata/OSD/B/BALDY.json +++ b/inst/extdata/OSD/B/BALDY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALKAN.json b/inst/extdata/OSD/B/BALKAN.json index c54ebb585c..4f4ba5d4a7 100644 --- a/inst/extdata/OSD/B/BALKAN.json +++ b/inst/extdata/OSD/B/BALKAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BALKYHORSE.json b/inst/extdata/OSD/B/BALKYHORSE.json index d6bacdd192..f7d5e8a3b8 100644 --- a/inst/extdata/OSD/B/BALKYHORSE.json +++ b/inst/extdata/OSD/B/BALKYHORSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BALLARD.json b/inst/extdata/OSD/B/BALLARD.json index a9c2717c66..affb2e6a5b 100644 --- a/inst/extdata/OSD/B/BALLARD.json +++ b/inst/extdata/OSD/B/BALLARD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALLINGER.json b/inst/extdata/OSD/B/BALLINGER.json index 55730f9767..abbd2c883d 100644 --- a/inst/extdata/OSD/B/BALLINGER.json +++ b/inst/extdata/OSD/B/BALLINGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALLONA.json b/inst/extdata/OSD/B/BALLONA.json index 62eb521855..a2288e690f 100644 --- a/inst/extdata/OSD/B/BALLONA.json +++ b/inst/extdata/OSD/B/BALLONA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALMAN.json b/inst/extdata/OSD/B/BALMAN.json index 80628e3480..65875d6731 100644 --- a/inst/extdata/OSD/B/BALMAN.json +++ b/inst/extdata/OSD/B/BALMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BALON.json b/inst/extdata/OSD/B/BALON.json index bbcca6420c..ecbe53e1e3 100644 --- a/inst/extdata/OSD/B/BALON.json +++ b/inst/extdata/OSD/B/BALON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BALTIC.json b/inst/extdata/OSD/B/BALTIC.json index a63b80a379..bea7d3632f 100644 --- a/inst/extdata/OSD/B/BALTIC.json +++ b/inst/extdata/OSD/B/BALTIC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BAMBER.json b/inst/extdata/OSD/B/BAMBER.json index 0a4f490004..b20cada34d 100644 --- a/inst/extdata/OSD/B/BAMBER.json +++ b/inst/extdata/OSD/B/BAMBER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BANCAS.json b/inst/extdata/OSD/B/BANCAS.json index 13dbf101b5..90726eb05e 100644 --- a/inst/extdata/OSD/B/BANCAS.json +++ b/inst/extdata/OSD/B/BANCAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BANCROFT.json b/inst/extdata/OSD/B/BANCROFT.json index 26dc9ca6b7..920e71148d 100644 --- a/inst/extdata/OSD/B/BANCROFT.json +++ b/inst/extdata/OSD/B/BANCROFT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BANGSTON.json b/inst/extdata/OSD/B/BANGSTON.json index b6f9d88f72..0db89e5ff1 100644 --- a/inst/extdata/OSD/B/BANGSTON.json +++ b/inst/extdata/OSD/B/BANGSTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BANISTER.json b/inst/extdata/OSD/B/BANISTER.json index 45c8a441f1..cc24ab67c2 100644 --- a/inst/extdata/OSD/B/BANISTER.json +++ b/inst/extdata/OSD/B/BANISTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BANKARD.json b/inst/extdata/OSD/B/BANKARD.json index 07e5f1f5d2..1ce1671026 100644 --- a/inst/extdata/OSD/B/BANKARD.json +++ b/inst/extdata/OSD/B/BANKARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively to somewhat excessively", - "drainage_overview": "excessively to somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BANKS.json b/inst/extdata/OSD/B/BANKS.json index 554a0bbbd6..ca3fb673ac 100644 --- a/inst/extdata/OSD/B/BANKS.json +++ b/inst/extdata/OSD/B/BANKS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively or somewhat excessively", - "drainage_overview": "excessively or somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BARELA.json b/inst/extdata/OSD/B/BARELA.json index 5a9f4402cc..715bce3dbe 100644 --- a/inst/extdata/OSD/B/BARELA.json +++ b/inst/extdata/OSD/B/BARELA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BARFIELD.json b/inst/extdata/OSD/B/BARFIELD.json index 4f7b3d313f..03776a8d3b 100644 --- a/inst/extdata/OSD/B/BARFIELD.json +++ b/inst/extdata/OSD/B/BARFIELD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BARFUSS.json b/inst/extdata/OSD/B/BARFUSS.json index 882eb55281..772e6ec285 100644 --- a/inst/extdata/OSD/B/BARFUSS.json +++ b/inst/extdata/OSD/B/BARFUSS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BARISHMAN.json b/inst/extdata/OSD/B/BARISHMAN.json index bf24041c92..0856a4c2a6 100644 --- a/inst/extdata/OSD/B/BARISHMAN.json +++ b/inst/extdata/OSD/B/BARISHMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BARNEY.json b/inst/extdata/OSD/B/BARNEY.json index 49ed29cff4..b4a4e53666 100644 --- a/inst/extdata/OSD/B/BARNEY.json +++ b/inst/extdata/OSD/B/BARNEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BARTLESVILLE.json b/inst/extdata/OSD/B/BARTLESVILLE.json index 9e95c646dd..99a990959e 100644 --- a/inst/extdata/OSD/B/BARTLESVILLE.json +++ b/inst/extdata/OSD/B/BARTLESVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BASCOM.json b/inst/extdata/OSD/B/BASCOM.json index ef04972b75..b67927037c 100644 --- a/inst/extdata/OSD/B/BASCOM.json +++ b/inst/extdata/OSD/B/BASCOM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BASFORD.json b/inst/extdata/OSD/B/BASFORD.json index dcea3a7485..a61ee710c8 100644 --- a/inst/extdata/OSD/B/BASFORD.json +++ b/inst/extdata/OSD/B/BASFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BASTROPBAY.json b/inst/extdata/OSD/B/BASTROPBAY.json index 072ab74e09..648a7a9f61 100644 --- a/inst/extdata/OSD/B/BASTROPBAY.json +++ b/inst/extdata/OSD/B/BASTROPBAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BASTSIL.json b/inst/extdata/OSD/B/BASTSIL.json index afd7d797c3..e3f5fc41af 100644 --- a/inst/extdata/OSD/B/BASTSIL.json +++ b/inst/extdata/OSD/B/BASTSIL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BATHEL.json b/inst/extdata/OSD/B/BATHEL.json index 49ab9b23e6..9d2c7ddc18 100644 --- a/inst/extdata/OSD/B/BATHEL.json +++ b/inst/extdata/OSD/B/BATHEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/B/BATTERSON.json b/inst/extdata/OSD/B/BATTERSON.json index 60245458c1..a09fcbc863 100644 --- a/inst/extdata/OSD/B/BATTERSON.json +++ b/inst/extdata/OSD/B/BATTERSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/B/BATTLEMENT.json b/inst/extdata/OSD/B/BATTLEMENT.json index fad7843567..33ccc14e60 100644 --- a/inst/extdata/OSD/B/BATTLEMENT.json +++ b/inst/extdata/OSD/B/BATTLEMENT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BATTLE_CREEK.json b/inst/extdata/OSD/B/BATTLE_CREEK.json index d10d83cb54..f86323e2ba 100644 --- a/inst/extdata/OSD/B/BATTLE_CREEK.json +++ b/inst/extdata/OSD/B/BATTLE_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BATZA.json b/inst/extdata/OSD/B/BATZA.json index 3d644ce736..b39fb1fa33 100644 --- a/inst/extdata/OSD/B/BATZA.json +++ b/inst/extdata/OSD/B/BATZA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BAVARIA.json b/inst/extdata/OSD/B/BAVARIA.json index 2fed9dc823..6ec2f29611 100644 --- a/inst/extdata/OSD/B/BAVARIA.json +++ b/inst/extdata/OSD/B/BAVARIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BAYAMON.json b/inst/extdata/OSD/B/BAYAMON.json index 31b58eeae3..d777f11450 100644 --- a/inst/extdata/OSD/B/BAYAMON.json +++ b/inst/extdata/OSD/B/BAYAMON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BAYSHORE.json b/inst/extdata/OSD/B/BAYSHORE.json index e364ce317c..7da6822e57 100644 --- a/inst/extdata/OSD/B/BAYSHORE.json +++ b/inst/extdata/OSD/B/BAYSHORE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BEAD.json b/inst/extdata/OSD/B/BEAD.json index f8240d86fa..6f0161502d 100644 --- a/inst/extdata/OSD/B/BEAD.json +++ b/inst/extdata/OSD/B/BEAD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BEARBEACH.json b/inst/extdata/OSD/B/BEARBEACH.json index 72a287c193..ae95de3392 100644 --- a/inst/extdata/OSD/B/BEARBEACH.json +++ b/inst/extdata/OSD/B/BEARBEACH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/B/BEAR_BASIN.json b/inst/extdata/OSD/B/BEAR_BASIN.json index 1d57dc4dba..6d346a0c31 100644 --- a/inst/extdata/OSD/B/BEAR_BASIN.json +++ b/inst/extdata/OSD/B/BEAR_BASIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BEAR_CREEK.json b/inst/extdata/OSD/B/BEAR_CREEK.json index 9405d7cd25..ab3d70d50e 100644 --- a/inst/extdata/OSD/B/BEAR_CREEK.json +++ b/inst/extdata/OSD/B/BEAR_CREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BEAR_LAKE.json b/inst/extdata/OSD/B/BEAR_LAKE.json index b68a93c7e2..529f29ae70 100644 --- a/inst/extdata/OSD/B/BEAR_LAKE.json +++ b/inst/extdata/OSD/B/BEAR_LAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BEAUCOUP.json b/inst/extdata/OSD/B/BEAUCOUP.json index 9550a58860..9b0f2d2f8f 100644 --- a/inst/extdata/OSD/B/BEAUCOUP.json +++ b/inst/extdata/OSD/B/BEAUCOUP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BEAUMAIN.json b/inst/extdata/OSD/B/BEAUMAIN.json index edb9febc74..c22a81fcbf 100644 --- a/inst/extdata/OSD/B/BEAUMAIN.json +++ b/inst/extdata/OSD/B/BEAUMAIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BEAVERTAIL.json b/inst/extdata/OSD/B/BEAVERTAIL.json index 05fbfb7a07..4b22e76ee5 100644 --- a/inst/extdata/OSD/B/BEAVERTAIL.json +++ b/inst/extdata/OSD/B/BEAVERTAIL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BECKTON.json b/inst/extdata/OSD/B/BECKTON.json index d1a2c59265..1087889358 100644 --- a/inst/extdata/OSD/B/BECKTON.json +++ b/inst/extdata/OSD/B/BECKTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BEETREE.json b/inst/extdata/OSD/B/BEETREE.json index c74f3dbd49..16a6f1fd44 100644 --- a/inst/extdata/OSD/B/BEETREE.json +++ b/inst/extdata/OSD/B/BEETREE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BELFIELD.json b/inst/extdata/OSD/B/BELFIELD.json index e325235336..dafffadb0c 100644 --- a/inst/extdata/OSD/B/BELFIELD.json +++ b/inst/extdata/OSD/B/BELFIELD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BELLEVILLE.json b/inst/extdata/OSD/B/BELLEVILLE.json index 2162e1f8c3..b196852d55 100644 --- a/inst/extdata/OSD/B/BELLEVILLE.json +++ b/inst/extdata/OSD/B/BELLEVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BELLOTA.json b/inst/extdata/OSD/B/BELLOTA.json index 486d3d58ad..52dd235e82 100644 --- a/inst/extdata/OSD/B/BELLOTA.json +++ b/inst/extdata/OSD/B/BELLOTA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BELUGA.json b/inst/extdata/OSD/B/BELUGA.json index 81e433ba82..80a638b019 100644 --- a/inst/extdata/OSD/B/BELUGA.json +++ b/inst/extdata/OSD/B/BELUGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BELVUE.json b/inst/extdata/OSD/B/BELVUE.json index 9d543ac5e5..c223e327d1 100644 --- a/inst/extdata/OSD/B/BELVUE.json +++ b/inst/extdata/OSD/B/BELVUE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BENCHLAKE.json b/inst/extdata/OSD/B/BENCHLAKE.json index b3cb4b1855..e76d314d39 100644 --- a/inst/extdata/OSD/B/BENCHLAKE.json +++ b/inst/extdata/OSD/B/BENCHLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BENCLARE.json b/inst/extdata/OSD/B/BENCLARE.json index bdf1e9d195..73ea1eaff2 100644 --- a/inst/extdata/OSD/B/BENCLARE.json +++ b/inst/extdata/OSD/B/BENCLARE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BENDEMEERE.json b/inst/extdata/OSD/B/BENDEMEERE.json index d320f04e4b..867aa6d8da 100644 --- a/inst/extdata/OSD/B/BENDEMEERE.json +++ b/inst/extdata/OSD/B/BENDEMEERE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BENFIELD.json b/inst/extdata/OSD/B/BENFIELD.json index 4b5228e79b..f2dc5e2f39 100644 --- a/inst/extdata/OSD/B/BENFIELD.json +++ b/inst/extdata/OSD/B/BENFIELD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BENSON.json b/inst/extdata/OSD/B/BENSON.json index 2dad9d3a5f..c914d5b8fa 100644 --- a/inst/extdata/OSD/B/BENSON.json +++ b/inst/extdata/OSD/B/BENSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BENTEEN.json b/inst/extdata/OSD/B/BENTEEN.json index 65bd1a58bc..c0e9b55565 100644 --- a/inst/extdata/OSD/B/BENTEEN.json +++ b/inst/extdata/OSD/B/BENTEEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BENTFORT.json b/inst/extdata/OSD/B/BENTFORT.json index cedd9a152e..bc70e8c515 100644 --- a/inst/extdata/OSD/B/BENTFORT.json +++ b/inst/extdata/OSD/B/BENTFORT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "moderately well to well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BEOTIA.json b/inst/extdata/OSD/B/BEOTIA.json index ab711134d5..e930be33aa 100644 --- a/inst/extdata/OSD/B/BEOTIA.json +++ b/inst/extdata/OSD/B/BEOTIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BERGKELLER.json b/inst/extdata/OSD/B/BERGKELLER.json index 700944ccaf..90ac02cc94 100644 --- a/inst/extdata/OSD/B/BERGKELLER.json +++ b/inst/extdata/OSD/B/BERGKELLER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BERLIN.json b/inst/extdata/OSD/B/BERLIN.json index 85f86a89d9..4b3c0256f7 100644 --- a/inst/extdata/OSD/B/BERLIN.json +++ b/inst/extdata/OSD/B/BERLIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BERNOW.json b/inst/extdata/OSD/B/BERNOW.json index e1c763547b..953a1875cc 100644 --- a/inst/extdata/OSD/B/BERNOW.json +++ b/inst/extdata/OSD/B/BERNOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BERRAY.json b/inst/extdata/OSD/B/BERRAY.json index be5ff63075..1f15d42782 100644 --- a/inst/extdata/OSD/B/BERRAY.json +++ b/inst/extdata/OSD/B/BERRAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BERTRAM.json b/inst/extdata/OSD/B/BERTRAM.json index 6bfa331387..b0bb65c42c 100644 --- a/inst/extdata/OSD/B/BERTRAM.json +++ b/inst/extdata/OSD/B/BERTRAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BESTPITCH.json b/inst/extdata/OSD/B/BESTPITCH.json index 569f48b856..312fbb15d2 100644 --- a/inst/extdata/OSD/B/BESTPITCH.json +++ b/inst/extdata/OSD/B/BESTPITCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BETONNIE.json b/inst/extdata/OSD/B/BETONNIE.json index 02e8f92f3b..0136b5e616 100644 --- a/inst/extdata/OSD/B/BETONNIE.json +++ b/inst/extdata/OSD/B/BETONNIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BEW.json b/inst/extdata/OSD/B/BEW.json index cab525da7f..a845f831b5 100644 --- a/inst/extdata/OSD/B/BEW.json +++ b/inst/extdata/OSD/B/BEW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BICKMORE.json b/inst/extdata/OSD/B/BICKMORE.json index f619efddb5..622159567f 100644 --- a/inst/extdata/OSD/B/BICKMORE.json +++ b/inst/extdata/OSD/B/BICKMORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BIEBER.json b/inst/extdata/OSD/B/BIEBER.json index d870b833e2..732d2505d9 100644 --- a/inst/extdata/OSD/B/BIEBER.json +++ b/inst/extdata/OSD/B/BIEBER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BIGAPPLE.json b/inst/extdata/OSD/B/BIGAPPLE.json index d80567f286..39ba79a6b6 100644 --- a/inst/extdata/OSD/B/BIGAPPLE.json +++ b/inst/extdata/OSD/B/BIGAPPLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BIGBEND.json b/inst/extdata/OSD/B/BIGBEND.json index ac1864ee00..ea959ee2c3 100644 --- a/inst/extdata/OSD/B/BIGBEND.json +++ b/inst/extdata/OSD/B/BIGBEND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BIGETTY.json b/inst/extdata/OSD/B/BIGETTY.json index 139830386c..cf1ffc5dcb 100644 --- a/inst/extdata/OSD/B/BIGETTY.json +++ b/inst/extdata/OSD/B/BIGETTY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BIGHEART.json b/inst/extdata/OSD/B/BIGHEART.json index e1c918d991..3f93e6b11d 100644 --- a/inst/extdata/OSD/B/BIGHEART.json +++ b/inst/extdata/OSD/B/BIGHEART.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BIGMOW.json b/inst/extdata/OSD/B/BIGMOW.json index f7043e3e19..f16571fa69 100644 --- a/inst/extdata/OSD/B/BIGMOW.json +++ b/inst/extdata/OSD/B/BIGMOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BIGRANT.json b/inst/extdata/OSD/B/BIGRANT.json index cc76ccd581..457aa5b11b 100644 --- a/inst/extdata/OSD/B/BIGRANT.json +++ b/inst/extdata/OSD/B/BIGRANT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BIGTREE.json b/inst/extdata/OSD/B/BIGTREE.json index a20443bcac..fe9d23df7a 100644 --- a/inst/extdata/OSD/B/BIGTREE.json +++ b/inst/extdata/OSD/B/BIGTREE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BIGWALL.json b/inst/extdata/OSD/B/BIGWALL.json index 9d0f6e238b..41d64020c5 100644 --- a/inst/extdata/OSD/B/BIGWALL.json +++ b/inst/extdata/OSD/B/BIGWALL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BIGWIN.json b/inst/extdata/OSD/B/BIGWIN.json index b00099792d..2057a6ddb6 100644 --- a/inst/extdata/OSD/B/BIGWIN.json +++ b/inst/extdata/OSD/B/BIGWIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BIG_BLUE.json b/inst/extdata/OSD/B/BIG_BLUE.json index c4a4e9adc8..64ccd56fea 100644 --- a/inst/extdata/OSD/B/BIG_BLUE.json +++ b/inst/extdata/OSD/B/BIG_BLUE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BIG_CYPRESS.json b/inst/extdata/OSD/B/BIG_CYPRESS.json index 84942a2b9d..7535d8ffd6 100644 --- a/inst/extdata/OSD/B/BIG_CYPRESS.json +++ b/inst/extdata/OSD/B/BIG_CYPRESS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BIJOU.json b/inst/extdata/OSD/B/BIJOU.json index 65576d3d9b..03ae365ae9 100644 --- a/inst/extdata/OSD/B/BIJOU.json +++ b/inst/extdata/OSD/B/BIJOU.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BILLETT.json b/inst/extdata/OSD/B/BILLETT.json index 293ee1cf57..2762a347e6 100644 --- a/inst/extdata/OSD/B/BILLETT.json +++ b/inst/extdata/OSD/B/BILLETT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BILLINGS.json b/inst/extdata/OSD/B/BILLINGS.json index c77c9e2b22..bdb51253fc 100644 --- a/inst/extdata/OSD/B/BILLINGS.json +++ b/inst/extdata/OSD/B/BILLINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BILLINGTON.json b/inst/extdata/OSD/B/BILLINGTON.json index 1576eb6fa3..d218438978 100644 --- a/inst/extdata/OSD/B/BILLINGTON.json +++ b/inst/extdata/OSD/B/BILLINGTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BINFORD.json b/inst/extdata/OSD/B/BINFORD.json index e63d06edd7..08dffe18c1 100644 --- a/inst/extdata/OSD/B/BINFORD.json +++ b/inst/extdata/OSD/B/BINFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BIRDS.json b/inst/extdata/OSD/B/BIRDS.json index 2428b4fca3..9e09eb4f2b 100644 --- a/inst/extdata/OSD/B/BIRDS.json +++ b/inst/extdata/OSD/B/BIRDS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BIRDSBORO.json b/inst/extdata/OSD/B/BIRDSBORO.json index 8755f0765a..51430495e5 100644 --- a/inst/extdata/OSD/B/BIRDSBORO.json +++ b/inst/extdata/OSD/B/BIRDSBORO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BISCAY.json b/inst/extdata/OSD/B/BISCAY.json index 44b0912e80..e747933293 100644 --- a/inst/extdata/OSD/B/BISCAY.json +++ b/inst/extdata/OSD/B/BISCAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BISCAYNE.json b/inst/extdata/OSD/B/BISCAYNE.json index abc61d1bc6..573ceb5148 100644 --- a/inst/extdata/OSD/B/BISCAYNE.json +++ b/inst/extdata/OSD/B/BISCAYNE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BITTON.json b/inst/extdata/OSD/B/BITTON.json index 0b7cb91455..e44c0fbbe9 100644 --- a/inst/extdata/OSD/B/BITTON.json +++ b/inst/extdata/OSD/B/BITTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACKBEAR.json b/inst/extdata/OSD/B/BLACKBEAR.json index 7479a234f5..e954fb6f33 100644 --- a/inst/extdata/OSD/B/BLACKBEAR.json +++ b/inst/extdata/OSD/B/BLACKBEAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACKBURN.json b/inst/extdata/OSD/B/BLACKBURN.json index c01eedcc52..48192a82b8 100644 --- a/inst/extdata/OSD/B/BLACKBURN.json +++ b/inst/extdata/OSD/B/BLACKBURN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACKETT.json b/inst/extdata/OSD/B/BLACKETT.json index 338c8b82d1..32e36d4180 100644 --- a/inst/extdata/OSD/B/BLACKETT.json +++ b/inst/extdata/OSD/B/BLACKETT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACKLEED.json b/inst/extdata/OSD/B/BLACKLEED.json index 9f3110bb07..10a48694bd 100644 --- a/inst/extdata/OSD/B/BLACKLEED.json +++ b/inst/extdata/OSD/B/BLACKLEED.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACKLOCK.json b/inst/extdata/OSD/B/BLACKLOCK.json index 3c860f1c21..d7f4d09ef0 100644 --- a/inst/extdata/OSD/B/BLACKLOCK.json +++ b/inst/extdata/OSD/B/BLACKLOCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/B/BLACKLOUP.json b/inst/extdata/OSD/B/BLACKLOUP.json index 57e84193a9..0ebf47046e 100644 --- a/inst/extdata/OSD/B/BLACKLOUP.json +++ b/inst/extdata/OSD/B/BLACKLOUP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BLACKROCK.json b/inst/extdata/OSD/B/BLACKROCK.json index 09ea4f1ccd..eee1d255a6 100644 --- a/inst/extdata/OSD/B/BLACKROCK.json +++ b/inst/extdata/OSD/B/BLACKROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLACK_CANYON.json b/inst/extdata/OSD/B/BLACK_CANYON.json index 39af697d02..d42185a5e9 100644 --- a/inst/extdata/OSD/B/BLACK_CANYON.json +++ b/inst/extdata/OSD/B/BLACK_CANYON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BLACK_RIDGE.json b/inst/extdata/OSD/B/BLACK_RIDGE.json index 5ca9d127ee..182f538f1b 100644 --- a/inst/extdata/OSD/B/BLACK_RIDGE.json +++ b/inst/extdata/OSD/B/BLACK_RIDGE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLAGO.json b/inst/extdata/OSD/B/BLAGO.json index a9394c410e..fcfb0842ca 100644 --- a/inst/extdata/OSD/B/BLAGO.json +++ b/inst/extdata/OSD/B/BLAGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BLAIRTON.json b/inst/extdata/OSD/B/BLAIRTON.json index 95e5a3150a..144460e6ad 100644 --- a/inst/extdata/OSD/B/BLAIRTON.json +++ b/inst/extdata/OSD/B/BLAIRTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BLAMER.json b/inst/extdata/OSD/B/BLAMER.json index 760be327e4..e600425a47 100644 --- a/inst/extdata/OSD/B/BLAMER.json +++ b/inst/extdata/OSD/B/BLAMER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLANCA.json b/inst/extdata/OSD/B/BLANCA.json index 020a14791d..5bf68d6a51 100644 --- a/inst/extdata/OSD/B/BLANCA.json +++ b/inst/extdata/OSD/B/BLANCA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLANCHE.json b/inst/extdata/OSD/B/BLANCHE.json index e17b302619..245d1bc5d9 100644 --- a/inst/extdata/OSD/B/BLANCHE.json +++ b/inst/extdata/OSD/B/BLANCHE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLANDBURG.json b/inst/extdata/OSD/B/BLANDBURG.json index 519112a15e..4229cbf56a 100644 --- a/inst/extdata/OSD/B/BLANDBURG.json +++ b/inst/extdata/OSD/B/BLANDBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BLANFORT.json b/inst/extdata/OSD/B/BLANFORT.json index 620a49bce4..7e98990cb0 100644 --- a/inst/extdata/OSD/B/BLANFORT.json +++ b/inst/extdata/OSD/B/BLANFORT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BLANTON.json b/inst/extdata/OSD/B/BLANTON.json index 0741194b7f..70bb957149 100644 --- a/inst/extdata/OSD/B/BLANTON.json +++ b/inst/extdata/OSD/B/BLANTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well, moderately well", + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BLOOM.json b/inst/extdata/OSD/B/BLOOM.json index 9a1e8ebf80..5a176f275f 100644 --- a/inst/extdata/OSD/B/BLOOM.json +++ b/inst/extdata/OSD/B/BLOOM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/B/BLUEJAY.json b/inst/extdata/OSD/B/BLUEJAY.json index e3b63ee3bb..882119cce8 100644 --- a/inst/extdata/OSD/B/BLUEJAY.json +++ b/inst/extdata/OSD/B/BLUEJAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BLUELIZARD.json b/inst/extdata/OSD/B/BLUELIZARD.json index bf3534330e..e1dcfaa014 100644 --- a/inst/extdata/OSD/B/BLUELIZARD.json +++ b/inst/extdata/OSD/B/BLUELIZARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BLUESPRIN.json b/inst/extdata/OSD/B/BLUESPRIN.json index f864430896..96c0def3c2 100644 --- a/inst/extdata/OSD/B/BLUESPRIN.json +++ b/inst/extdata/OSD/B/BLUESPRIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOARDCAMP.json b/inst/extdata/OSD/B/BOARDCAMP.json index 5ff550cf44..8eda8772d3 100644 --- a/inst/extdata/OSD/B/BOARDCAMP.json +++ b/inst/extdata/OSD/B/BOARDCAMP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOARDTREE.json b/inst/extdata/OSD/B/BOARDTREE.json index 25ed2f30c8..a42a68cd02 100644 --- a/inst/extdata/OSD/B/BOARDTREE.json +++ b/inst/extdata/OSD/B/BOARDTREE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOBERT.json b/inst/extdata/OSD/B/BOBERT.json index 4a2771af37..a88625b1db 100644 --- a/inst/extdata/OSD/B/BOBERT.json +++ b/inst/extdata/OSD/B/BOBERT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BOBTAIL.json b/inst/extdata/OSD/B/BOBTAIL.json index 46a4daeab2..17e6d94380 100644 --- a/inst/extdata/OSD/B/BOBTAIL.json +++ b/inst/extdata/OSD/B/BOBTAIL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BOCA.json b/inst/extdata/OSD/B/BOCA.json index 9700e3ea7b..8d23c322d3 100644 --- a/inst/extdata/OSD/B/BOCA.json +++ b/inst/extdata/OSD/B/BOCA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BOCOX.json b/inst/extdata/OSD/B/BOCOX.json index fd015c489b..914e322028 100644 --- a/inst/extdata/OSD/B/BOCOX.json +++ b/inst/extdata/OSD/B/BOCOX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/B/BOETTCHER.json b/inst/extdata/OSD/B/BOETTCHER.json index 43a47f831e..54d545ab51 100644 --- a/inst/extdata/OSD/B/BOETTCHER.json +++ b/inst/extdata/OSD/B/BOETTCHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOGOSLOF.json b/inst/extdata/OSD/B/BOGOSLOF.json index 67de8b6e3b..83c178bba9 100644 --- a/inst/extdata/OSD/B/BOGOSLOF.json +++ b/inst/extdata/OSD/B/BOGOSLOF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BOLLETTO.json b/inst/extdata/OSD/B/BOLLETTO.json index e0b6351902..dd64bf0b50 100644 --- a/inst/extdata/OSD/B/BOLLETTO.json +++ b/inst/extdata/OSD/B/BOLLETTO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BOLTUS.json b/inst/extdata/OSD/B/BOLTUS.json index 274b2e5170..062f9812cc 100644 --- a/inst/extdata/OSD/B/BOLTUS.json +++ b/inst/extdata/OSD/B/BOLTUS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BON.json b/inst/extdata/OSD/B/BON.json index f5bd167843..faaad7c640 100644 --- a/inst/extdata/OSD/B/BON.json +++ b/inst/extdata/OSD/B/BON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BONDRANCH.json b/inst/extdata/OSD/B/BONDRANCH.json index d349883918..a4e2229838 100644 --- a/inst/extdata/OSD/B/BONDRANCH.json +++ b/inst/extdata/OSD/B/BONDRANCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BONEDRAW.json b/inst/extdata/OSD/B/BONEDRAW.json index 046011b337..63aaa4469c 100644 --- a/inst/extdata/OSD/B/BONEDRAW.json +++ b/inst/extdata/OSD/B/BONEDRAW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BONESTEEL.json b/inst/extdata/OSD/B/BONESTEEL.json index adde619441..d15f126890 100644 --- a/inst/extdata/OSD/B/BONESTEEL.json +++ b/inst/extdata/OSD/B/BONESTEEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BONNIE.json b/inst/extdata/OSD/B/BONNIE.json index 1ba2cd5db8..cef5cc958f 100644 --- a/inst/extdata/OSD/B/BONNIE.json +++ b/inst/extdata/OSD/B/BONNIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BONSALL.json b/inst/extdata/OSD/B/BONSALL.json index 269dfb3fef..1313dacbb4 100644 --- a/inst/extdata/OSD/B/BONSALL.json +++ b/inst/extdata/OSD/B/BONSALL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BONWIER.json b/inst/extdata/OSD/B/BONWIER.json index 5e2f0af3c8..31d01e2e5a 100644 --- a/inst/extdata/OSD/B/BONWIER.json +++ b/inst/extdata/OSD/B/BONWIER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BOOKER.json b/inst/extdata/OSD/B/BOOKER.json index 08c4e920da..6b44dee88f 100644 --- a/inst/extdata/OSD/B/BOOKER.json +++ b/inst/extdata/OSD/B/BOOKER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BOONTON.json b/inst/extdata/OSD/B/BOONTON.json index f1287b027c..3368b80c13 100644 --- a/inst/extdata/OSD/B/BOONTON.json +++ b/inst/extdata/OSD/B/BOONTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BORDEAUX.json b/inst/extdata/OSD/B/BORDEAUX.json index 07a312c7dd..273a926c7c 100644 --- a/inst/extdata/OSD/B/BORDEAUX.json +++ b/inst/extdata/OSD/B/BORDEAUX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BORDEN.json b/inst/extdata/OSD/B/BORDEN.json index 2ac1fac5b4..1910ed7596 100644 --- a/inst/extdata/OSD/B/BORDEN.json +++ b/inst/extdata/OSD/B/BORDEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well and well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BORREGO.json b/inst/extdata/OSD/B/BORREGO.json index b44e476e1c..f582285378 100644 --- a/inst/extdata/OSD/B/BORREGO.json +++ b/inst/extdata/OSD/B/BORREGO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BORUFF.json b/inst/extdata/OSD/B/BORUFF.json index fe85dbfa9f..c94c6041fb 100644 --- a/inst/extdata/OSD/B/BORUFF.json +++ b/inst/extdata/OSD/B/BORUFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BORUP.json b/inst/extdata/OSD/B/BORUP.json index 49e94091f4..746f8793aa 100644 --- a/inst/extdata/OSD/B/BORUP.json +++ b/inst/extdata/OSD/B/BORUP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BOSANKO.json b/inst/extdata/OSD/B/BOSANKO.json index b882f9729a..58222e3b5b 100644 --- a/inst/extdata/OSD/B/BOSANKO.json +++ b/inst/extdata/OSD/B/BOSANKO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BOSCAWEN.json b/inst/extdata/OSD/B/BOSCAWEN.json index 3269650b43..4bc97ea830 100644 --- a/inst/extdata/OSD/B/BOSCAWEN.json +++ b/inst/extdata/OSD/B/BOSCAWEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BOSQUE.json b/inst/extdata/OSD/B/BOSQUE.json index 67a8242c1c..318e564f59 100644 --- a/inst/extdata/OSD/B/BOSQUE.json +++ b/inst/extdata/OSD/B/BOSQUE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOTTLE.json b/inst/extdata/OSD/B/BOTTLE.json index 38178f9588..1b9d4713c9 100644 --- a/inst/extdata/OSD/B/BOTTLE.json +++ b/inst/extdata/OSD/B/BOTTLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BOUNDRIDGE.json b/inst/extdata/OSD/B/BOUNDRIDGE.json index d3828afcf8..6971a274c0 100644 --- a/inst/extdata/OSD/B/BOUNDRIDGE.json +++ b/inst/extdata/OSD/B/BOUNDRIDGE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BOWBELLS.json b/inst/extdata/OSD/B/BOWBELLS.json index 33a084668e..95131ede89 100644 --- a/inst/extdata/OSD/B/BOWBELLS.json +++ b/inst/extdata/OSD/B/BOWBELLS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BOWMANSVILLE.json b/inst/extdata/OSD/B/BOWMANSVILLE.json index c77ebf53da..9bdee454bf 100644 --- a/inst/extdata/OSD/B/BOWMANSVILLE.json +++ b/inst/extdata/OSD/B/BOWMANSVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/B/BOXFORD.json b/inst/extdata/OSD/B/BOXFORD.json index 228a1f15a9..7e5b9d0c74 100644 --- a/inst/extdata/OSD/B/BOXFORD.json +++ b/inst/extdata/OSD/B/BOXFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BOYLE.json b/inst/extdata/OSD/B/BOYLE.json index 6c727c2ddc..114e7a5b57 100644 --- a/inst/extdata/OSD/B/BOYLE.json +++ b/inst/extdata/OSD/B/BOYLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/B/BOYSEN.json b/inst/extdata/OSD/B/BOYSEN.json index bc81f110fd..d0a2997723 100644 --- a/inst/extdata/OSD/B/BOYSEN.json +++ b/inst/extdata/OSD/B/BOYSEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BOZE.json b/inst/extdata/OSD/B/BOZE.json index f8ca631772..b808f355a0 100644 --- a/inst/extdata/OSD/B/BOZE.json +++ b/inst/extdata/OSD/B/BOZE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BOZEMAN.json b/inst/extdata/OSD/B/BOZEMAN.json index fbdc3cd819..c0969d489a 100644 --- a/inst/extdata/OSD/B/BOZEMAN.json +++ b/inst/extdata/OSD/B/BOZEMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRADSHAW.json b/inst/extdata/OSD/B/BRADSHAW.json index 467d0ee870..9ca1e4ef87 100644 --- a/inst/extdata/OSD/B/BRADSHAW.json +++ b/inst/extdata/OSD/B/BRADSHAW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRAF.json b/inst/extdata/OSD/B/BRAF.json index acc2b51c25..a990000bc4 100644 --- a/inst/extdata/OSD/B/BRAF.json +++ b/inst/extdata/OSD/B/BRAF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BRAMAN.json b/inst/extdata/OSD/B/BRAMAN.json index 44965990e6..2fe2c79cf7 100644 --- a/inst/extdata/OSD/B/BRAMAN.json +++ b/inst/extdata/OSD/B/BRAMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRAMLET.json b/inst/extdata/OSD/B/BRAMLET.json index e1ad3c1cf6..4c596dee55 100644 --- a/inst/extdata/OSD/B/BRAMLET.json +++ b/inst/extdata/OSD/B/BRAMLET.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BRANDYWINE.json b/inst/extdata/OSD/B/BRANDYWINE.json index 2c98b7f82a..9b42d338ba 100644 --- a/inst/extdata/OSD/B/BRANDYWINE.json +++ b/inst/extdata/OSD/B/BRANDYWINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/B/BRANTEL.json b/inst/extdata/OSD/B/BRANTEL.json index 46c9a4d6b3..1f629adff6 100644 --- a/inst/extdata/OSD/B/BRANTEL.json +++ b/inst/extdata/OSD/B/BRANTEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "excessively and somewhat excessively", + "drainage": "excessively, somewhat excessively", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/B/BRANYON.json b/inst/extdata/OSD/B/BRANYON.json index a645eb8756..94e506ce3b 100644 --- a/inst/extdata/OSD/B/BRANYON.json +++ b/inst/extdata/OSD/B/BRANYON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BRASHEAR.json b/inst/extdata/OSD/B/BRASHEAR.json index 4540cf2e5f..6aebfe398f 100644 --- a/inst/extdata/OSD/B/BRASHEAR.json +++ b/inst/extdata/OSD/B/BRASHEAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BREAKNECK.json b/inst/extdata/OSD/B/BREAKNECK.json index 154e248929..e339fa796f 100644 --- a/inst/extdata/OSD/B/BREAKNECK.json +++ b/inst/extdata/OSD/B/BREAKNECK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRECKENRIDGE.json b/inst/extdata/OSD/B/BRECKENRIDGE.json index f7deec6cef..35f25671b1 100644 --- a/inst/extdata/OSD/B/BRECKENRIDGE.json +++ b/inst/extdata/OSD/B/BRECKENRIDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BREHM.json b/inst/extdata/OSD/B/BREHM.json index 533762c13a..04e15cec92 100644 --- a/inst/extdata/OSD/B/BREHM.json +++ b/inst/extdata/OSD/B/BREHM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRENDA.json b/inst/extdata/OSD/B/BRENDA.json index 82317249ad..1eee608307 100644 --- a/inst/extdata/OSD/B/BRENDA.json +++ b/inst/extdata/OSD/B/BRENDA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRENTWOOD.json b/inst/extdata/OSD/B/BRENTWOOD.json index 1391c8c03d..c7ffd48a59 100644 --- a/inst/extdata/OSD/B/BRENTWOOD.json +++ b/inst/extdata/OSD/B/BRENTWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BRESSER.json b/inst/extdata/OSD/B/BRESSER.json index 8bc66af19b..30c57aefcc 100644 --- a/inst/extdata/OSD/B/BRESSER.json +++ b/inst/extdata/OSD/B/BRESSER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BREVORT.json b/inst/extdata/OSD/B/BREVORT.json index 7fad4c0d64..3603d8b234 100644 --- a/inst/extdata/OSD/B/BREVORT.json +++ b/inst/extdata/OSD/B/BREVORT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BREWER.json b/inst/extdata/OSD/B/BREWER.json index 1141de862b..be001c7f17 100644 --- a/inst/extdata/OSD/B/BREWER.json +++ b/inst/extdata/OSD/B/BREWER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BRIDGEHAMPTON.json b/inst/extdata/OSD/B/BRIDGEHAMPTON.json index dcd08eaa92..673d3e4723 100644 --- a/inst/extdata/OSD/B/BRIDGEHAMPTON.json +++ b/inst/extdata/OSD/B/BRIDGEHAMPTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BRIEF.json b/inst/extdata/OSD/B/BRIEF.json index 97c83c315e..2389f9f6ac 100644 --- a/inst/extdata/OSD/B/BRIEF.json +++ b/inst/extdata/OSD/B/BRIEF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRIERY.json b/inst/extdata/OSD/B/BRIERY.json index 84d5e32f08..f08233e91c 100644 --- a/inst/extdata/OSD/B/BRIERY.json +++ b/inst/extdata/OSD/B/BRIERY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BRIGGS.json b/inst/extdata/OSD/B/BRIGGS.json index a11eeacd2b..7e62798d9b 100644 --- a/inst/extdata/OSD/B/BRIGGS.json +++ b/inst/extdata/OSD/B/BRIGGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BRINY.json b/inst/extdata/OSD/B/BRINY.json index 589adf3c35..cf782f8a0c 100644 --- a/inst/extdata/OSD/B/BRINY.json +++ b/inst/extdata/OSD/B/BRINY.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly or very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BROADALBIN.json b/inst/extdata/OSD/B/BROADALBIN.json index 9914a16226..5bbc3a419a 100644 --- a/inst/extdata/OSD/B/BROADALBIN.json +++ b/inst/extdata/OSD/B/BROADALBIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BROADAXE.json b/inst/extdata/OSD/B/BROADAXE.json index 0d09195907..4bedcc111a 100644 --- a/inst/extdata/OSD/B/BROADAXE.json +++ b/inst/extdata/OSD/B/BROADAXE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BROAD_CREEK.json b/inst/extdata/OSD/B/BROAD_CREEK.json index ea6de8db9c..1af9de07f9 100644 --- a/inst/extdata/OSD/B/BROAD_CREEK.json +++ b/inst/extdata/OSD/B/BROAD_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BROKIT.json b/inst/extdata/OSD/B/BROKIT.json index 0a43f93be1..d84a135e27 100644 --- a/inst/extdata/OSD/B/BROKIT.json +++ b/inst/extdata/OSD/B/BROKIT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BROSELEY.json b/inst/extdata/OSD/B/BROSELEY.json index d07bec58fe..5b2cbd1d6a 100644 --- a/inst/extdata/OSD/B/BROSELEY.json +++ b/inst/extdata/OSD/B/BROSELEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BROSS.json b/inst/extdata/OSD/B/BROSS.json index ed6e93acfd..25d2f95685 100644 --- a/inst/extdata/OSD/B/BROSS.json +++ b/inst/extdata/OSD/B/BROSS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well to moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BROWN.json b/inst/extdata/OSD/B/BROWN.json index d0d6ee5cbe..36715c94c5 100644 --- a/inst/extdata/OSD/B/BROWN.json +++ b/inst/extdata/OSD/B/BROWN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BROWNRIGG.json b/inst/extdata/OSD/B/BROWNRIGG.json index 46890dcd0e..e9e06aee61 100644 --- a/inst/extdata/OSD/B/BROWNRIGG.json +++ b/inst/extdata/OSD/B/BROWNRIGG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRUCE.json b/inst/extdata/OSD/B/BRUCE.json index 9c0ccc97d9..c870fafb8b 100644 --- a/inst/extdata/OSD/B/BRUCE.json +++ b/inst/extdata/OSD/B/BRUCE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BRUELLA.json b/inst/extdata/OSD/B/BRUELLA.json index f5cbf10ae5..cb45dbaf97 100644 --- a/inst/extdata/OSD/B/BRUELLA.json +++ b/inst/extdata/OSD/B/BRUELLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BRUNI.json b/inst/extdata/OSD/B/BRUNI.json index 3338fdefc6..92e434400f 100644 --- a/inst/extdata/OSD/B/BRUNI.json +++ b/inst/extdata/OSD/B/BRUNI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRYANT.json b/inst/extdata/OSD/B/BRYANT.json index 00404015d2..8f1279d41b 100644 --- a/inst/extdata/OSD/B/BRYANT.json +++ b/inst/extdata/OSD/B/BRYANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BRYNWOOD.json b/inst/extdata/OSD/B/BRYNWOOD.json index 848ff1abae..436363468a 100644 --- a/inst/extdata/OSD/B/BRYNWOOD.json +++ b/inst/extdata/OSD/B/BRYNWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/B/BUCHANAN.json b/inst/extdata/OSD/B/BUCHANAN.json index d3fae9a3ef..99fde24e85 100644 --- a/inst/extdata/OSD/B/BUCHANAN.json +++ b/inst/extdata/OSD/B/BUCHANAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BUCHENAU.json b/inst/extdata/OSD/B/BUCHENAU.json index 118caa7716..e6eaf70778 100644 --- a/inst/extdata/OSD/B/BUCHENAU.json +++ b/inst/extdata/OSD/B/BUCHENAU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BUCKHOUSE.json b/inst/extdata/OSD/B/BUCKHOUSE.json index 71fef6d55c..8b4e97fddb 100644 --- a/inst/extdata/OSD/B/BUCKHOUSE.json +++ b/inst/extdata/OSD/B/BUCKHOUSE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUCKSKIN.json b/inst/extdata/OSD/B/BUCKSKIN.json index 2a65f027a6..ba2af24e58 100644 --- a/inst/extdata/OSD/B/BUCKSKIN.json +++ b/inst/extdata/OSD/B/BUCKSKIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUELL.json b/inst/extdata/OSD/B/BUELL.json index 8abeaeec6a..871ce24d01 100644 --- a/inst/extdata/OSD/B/BUELL.json +++ b/inst/extdata/OSD/B/BUELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BUFFORK.json b/inst/extdata/OSD/B/BUFFORK.json index 28694242e0..01ef9abc46 100644 --- a/inst/extdata/OSD/B/BUFFORK.json +++ b/inst/extdata/OSD/B/BUFFORK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BULL.json b/inst/extdata/OSD/B/BULL.json index c314e29b7c..ba21a9a31e 100644 --- a/inst/extdata/OSD/B/BULL.json +++ b/inst/extdata/OSD/B/BULL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BULLBASIN.json b/inst/extdata/OSD/B/BULLBASIN.json index d5a7a187a0..bdf9235c89 100644 --- a/inst/extdata/OSD/B/BULLBASIN.json +++ b/inst/extdata/OSD/B/BULLBASIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BULLCREEK.json b/inst/extdata/OSD/B/BULLCREEK.json index 35a15fb40d..a6e880ff6f 100644 --- a/inst/extdata/OSD/B/BULLCREEK.json +++ b/inst/extdata/OSD/B/BULLCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/B/BULLFOR.json b/inst/extdata/OSD/B/BULLFOR.json index ea1c12de6c..9f53c54646 100644 --- a/inst/extdata/OSD/B/BULLFOR.json +++ b/inst/extdata/OSD/B/BULLFOR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BULLROAR.json b/inst/extdata/OSD/B/BULLROAR.json index fbb46d3ba4..c4a6e68d43 100644 --- a/inst/extdata/OSD/B/BULLROAR.json +++ b/inst/extdata/OSD/B/BULLROAR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BURCHAM.json b/inst/extdata/OSD/B/BURCHAM.json index c79120ce57..16522a86aa 100644 --- a/inst/extdata/OSD/B/BURCHAM.json +++ b/inst/extdata/OSD/B/BURCHAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/B/BURGESS.json b/inst/extdata/OSD/B/BURGESS.json index 43a92a8746..8c3ef1ce23 100644 --- a/inst/extdata/OSD/B/BURGESS.json +++ b/inst/extdata/OSD/B/BURGESS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BURGI.json b/inst/extdata/OSD/B/BURGI.json index 7e921db74d..dab393a2c3 100644 --- a/inst/extdata/OSD/B/BURGI.json +++ b/inst/extdata/OSD/B/BURGI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/B/BURKE.json b/inst/extdata/OSD/B/BURKE.json index 93307ed04c..ac47a4dfc2 100644 --- a/inst/extdata/OSD/B/BURKE.json +++ b/inst/extdata/OSD/B/BURKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BURLEIGH.json b/inst/extdata/OSD/B/BURLEIGH.json index 29ca9d70d2..1379015fd1 100644 --- a/inst/extdata/OSD/B/BURLEIGH.json +++ b/inst/extdata/OSD/B/BURLEIGH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/B/BURLESON.json b/inst/extdata/OSD/B/BURLESON.json index 4142aae9fb..b2b91111f6 100644 --- a/inst/extdata/OSD/B/BURLESON.json +++ b/inst/extdata/OSD/B/BURLESON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BURLINGAME.json b/inst/extdata/OSD/B/BURLINGAME.json index 40f0df9f47..dbf81ff4ba 100644 --- a/inst/extdata/OSD/B/BURLINGAME.json +++ b/inst/extdata/OSD/B/BURLINGAME.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BURNTFLAT.json b/inst/extdata/OSD/B/BURNTFLAT.json index a3b56fac35..e4e4945e53 100644 --- a/inst/extdata/OSD/B/BURNTFLAT.json +++ b/inst/extdata/OSD/B/BURNTFLAT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BURNTSHACK.json b/inst/extdata/OSD/B/BURNTSHACK.json index a7931d5dde..3d5a5c47af 100644 --- a/inst/extdata/OSD/B/BURNTSHACK.json +++ b/inst/extdata/OSD/B/BURNTSHACK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/B/BURROIN.json b/inst/extdata/OSD/B/BURROIN.json index 50208036d6..d82fd6447b 100644 --- a/inst/extdata/OSD/B/BURROIN.json +++ b/inst/extdata/OSD/B/BURROIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUSHER.json b/inst/extdata/OSD/B/BUSHER.json index 013adf3d0b..5bab89c701 100644 --- a/inst/extdata/OSD/B/BUSHER.json +++ b/inst/extdata/OSD/B/BUSHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUSTLE.json b/inst/extdata/OSD/B/BUSTLE.json index 0782c0bebd..c47e7403f2 100644 --- a/inst/extdata/OSD/B/BUSTLE.json +++ b/inst/extdata/OSD/B/BUSTLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUTCHE.json b/inst/extdata/OSD/B/BUTCHE.json index fc2533bd43..35eb17bb57 100644 --- a/inst/extdata/OSD/B/BUTCHE.json +++ b/inst/extdata/OSD/B/BUTCHE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/B/BUTTERFIELD.json b/inst/extdata/OSD/B/BUTTERFIELD.json index 7a718fd2f6..787f791fa9 100644 --- a/inst/extdata/OSD/B/BUTTERFIELD.json +++ b/inst/extdata/OSD/B/BUTTERFIELD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/B/BUTTERMILK.json b/inst/extdata/OSD/B/BUTTERMILK.json index 71491f62ed..30238d0587 100644 --- a/inst/extdata/OSD/B/BUTTERMILK.json +++ b/inst/extdata/OSD/B/BUTTERMILK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/B/BUTTONWOOD.json b/inst/extdata/OSD/B/BUTTONWOOD.json index 4ee00d8072..e2467fca2f 100644 --- a/inst/extdata/OSD/B/BUTTONWOOD.json +++ b/inst/extdata/OSD/B/BUTTONWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/B/BYRNIE.json b/inst/extdata/OSD/B/BYRNIE.json index 4ae785bed5..189558f705 100644 --- a/inst/extdata/OSD/B/BYRNIE.json +++ b/inst/extdata/OSD/B/BYRNIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CABELL.json b/inst/extdata/OSD/C/CABELL.json index e4927280aa..4faa16b0bb 100644 --- a/inst/extdata/OSD/C/CABELL.json +++ b/inst/extdata/OSD/C/CABELL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CABEZON.json b/inst/extdata/OSD/C/CABEZON.json index 4be38e805b..fcb78dc8be 100644 --- a/inst/extdata/OSD/C/CABEZON.json +++ b/inst/extdata/OSD/C/CABEZON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CABINCREEK.json b/inst/extdata/OSD/C/CABINCREEK.json index 13074a20f3..cb8612751f 100644 --- a/inst/extdata/OSD/C/CABINCREEK.json +++ b/inst/extdata/OSD/C/CABINCREEK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CABLE.json b/inst/extdata/OSD/C/CABLE.json index 3394584b00..92b08b43cf 100644 --- a/inst/extdata/OSD/C/CABLE.json +++ b/inst/extdata/OSD/C/CABLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CACHE.json b/inst/extdata/OSD/C/CACHE.json index af8e29a28b..cc5084d9b2 100644 --- a/inst/extdata/OSD/C/CACHE.json +++ b/inst/extdata/OSD/C/CACHE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CACIQUE.json b/inst/extdata/OSD/C/CACIQUE.json index c50c940adc..5ac06e6675 100644 --- a/inst/extdata/OSD/C/CACIQUE.json +++ b/inst/extdata/OSD/C/CACIQUE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CADDO.json b/inst/extdata/OSD/C/CADDO.json index b4757a0df5..9d083dc409 100644 --- a/inst/extdata/OSD/C/CADDO.json +++ b/inst/extdata/OSD/C/CADDO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CAFFEY.json b/inst/extdata/OSD/C/CAFFEY.json index 6cd8dcdbc3..b8b7639575 100644 --- a/inst/extdata/OSD/C/CAFFEY.json +++ b/inst/extdata/OSD/C/CAFFEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CALABAR.json b/inst/extdata/OSD/C/CALABAR.json index 7ee1dd6b26..c2c82a446b 100644 --- a/inst/extdata/OSD/C/CALABAR.json +++ b/inst/extdata/OSD/C/CALABAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CALAMINE.json b/inst/extdata/OSD/C/CALAMINE.json index f869178cc1..0989b1121b 100644 --- a/inst/extdata/OSD/C/CALAMINE.json +++ b/inst/extdata/OSD/C/CALAMINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CALAMITY.json b/inst/extdata/OSD/C/CALAMITY.json index 16a99989fe..6d4c75ff30 100644 --- a/inst/extdata/OSD/C/CALAMITY.json +++ b/inst/extdata/OSD/C/CALAMITY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CALCO.json b/inst/extdata/OSD/C/CALCO.json index dfaabc2510..1e13a04016 100644 --- a/inst/extdata/OSD/C/CALCO.json +++ b/inst/extdata/OSD/C/CALCO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CALERA.json b/inst/extdata/OSD/C/CALERA.json index dda0508a30..b81b7d7251 100644 --- a/inst/extdata/OSD/C/CALERA.json +++ b/inst/extdata/OSD/C/CALERA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CALICOTT.json b/inst/extdata/OSD/C/CALICOTT.json index 82e03f6f15..7d48b10226 100644 --- a/inst/extdata/OSD/C/CALICOTT.json +++ b/inst/extdata/OSD/C/CALICOTT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively to excessively", + "drainage": "excessively, somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/C/CALIFON.json b/inst/extdata/OSD/C/CALIFON.json index df417eabeb..5b2bc5dd10 100644 --- a/inst/extdata/OSD/C/CALIFON.json +++ b/inst/extdata/OSD/C/CALIFON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CALKINS.json b/inst/extdata/OSD/C/CALKINS.json index f30ce23f34..6d3b011c41 100644 --- a/inst/extdata/OSD/C/CALKINS.json +++ b/inst/extdata/OSD/C/CALKINS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CALLEGUAS.json b/inst/extdata/OSD/C/CALLEGUAS.json index e140111b22..66f28f245a 100644 --- a/inst/extdata/OSD/C/CALLEGUAS.json +++ b/inst/extdata/OSD/C/CALLEGUAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CALMAR.json b/inst/extdata/OSD/C/CALMAR.json index 5f7c3a7545..13bde4aa5e 100644 --- a/inst/extdata/OSD/C/CALMAR.json +++ b/inst/extdata/OSD/C/CALMAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CALVERTON.json b/inst/extdata/OSD/C/CALVERTON.json index 803304dfa9..4fb1cb8ff5 100644 --- a/inst/extdata/OSD/C/CALVERTON.json +++ b/inst/extdata/OSD/C/CALVERTON.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "moderately well and somewhat poorly" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CAMBERN.json b/inst/extdata/OSD/C/CAMBERN.json index 2fc9696307..56fe615018 100644 --- a/inst/extdata/OSD/C/CAMBERN.json +++ b/inst/extdata/OSD/C/CAMBERN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CAMTOWN.json b/inst/extdata/OSD/C/CAMTOWN.json index 6fcfb26b3c..acf3c8023c 100644 --- a/inst/extdata/OSD/C/CAMTOWN.json +++ b/inst/extdata/OSD/C/CAMTOWN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANANDAIGUA.json b/inst/extdata/OSD/C/CANANDAIGUA.json index 8c1863a4ab..d645471950 100644 --- a/inst/extdata/OSD/C/CANANDAIGUA.json +++ b/inst/extdata/OSD/C/CANANDAIGUA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANASERAGA.json b/inst/extdata/OSD/C/CANASERAGA.json index 56500a8d79..ceb2cd6366 100644 --- a/inst/extdata/OSD/C/CANASERAGA.json +++ b/inst/extdata/OSD/C/CANASERAGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CANAVERAL.json b/inst/extdata/OSD/C/CANAVERAL.json index 824c608809..26fa1b8882 100644 --- a/inst/extdata/OSD/C/CANAVERAL.json +++ b/inst/extdata/OSD/C/CANAVERAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly to moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANEEK.json b/inst/extdata/OSD/C/CANEEK.json index 33d77cbb10..968660af9f 100644 --- a/inst/extdata/OSD/C/CANEEK.json +++ b/inst/extdata/OSD/C/CANEEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANEYVILLE.json b/inst/extdata/OSD/C/CANEYVILLE.json index af4f868efb..1783ecf91f 100644 --- a/inst/extdata/OSD/C/CANEYVILLE.json +++ b/inst/extdata/OSD/C/CANEYVILLE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CANEZ.json b/inst/extdata/OSD/C/CANEZ.json index 343194d1c4..0bac1c65c8 100644 --- a/inst/extdata/OSD/C/CANEZ.json +++ b/inst/extdata/OSD/C/CANEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CANISTEO.json b/inst/extdata/OSD/C/CANISTEO.json index 55a77c19ef..551c95b32f 100644 --- a/inst/extdata/OSD/C/CANISTEO.json +++ b/inst/extdata/OSD/C/CANISTEO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANLON.json b/inst/extdata/OSD/C/CANLON.json index 860002780c..20832a8832 100644 --- a/inst/extdata/OSD/C/CANLON.json +++ b/inst/extdata/OSD/C/CANLON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CANTLE.json b/inst/extdata/OSD/C/CANTLE.json index 3f03eeda2e..069f696657 100644 --- a/inst/extdata/OSD/C/CANTLE.json +++ b/inst/extdata/OSD/C/CANTLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CANYON.json b/inst/extdata/OSD/C/CANYON.json index 1b10583b81..793cbc08b5 100644 --- a/inst/extdata/OSD/C/CANYON.json +++ b/inst/extdata/OSD/C/CANYON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CANYONSPRING.json b/inst/extdata/OSD/C/CANYONSPRING.json index f94295fae3..cb0514d8c9 100644 --- a/inst/extdata/OSD/C/CANYONSPRING.json +++ b/inst/extdata/OSD/C/CANYONSPRING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CAPAY.json b/inst/extdata/OSD/C/CAPAY.json index a3542e586f..da6301b2f6 100644 --- a/inst/extdata/OSD/C/CAPAY.json +++ b/inst/extdata/OSD/C/CAPAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CAPE.json b/inst/extdata/OSD/C/CAPE.json index 6a621691df..d71358be9d 100644 --- a/inst/extdata/OSD/C/CAPE.json +++ b/inst/extdata/OSD/C/CAPE.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CAPITAN.json b/inst/extdata/OSD/C/CAPITAN.json index 678648bbb1..874bd79ce4 100644 --- a/inst/extdata/OSD/C/CAPITAN.json +++ b/inst/extdata/OSD/C/CAPITAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CAPITOLA.json b/inst/extdata/OSD/C/CAPITOLA.json index 6e80652cf8..ba1deb19f3 100644 --- a/inst/extdata/OSD/C/CAPITOLA.json +++ b/inst/extdata/OSD/C/CAPITOLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CAPULIN.json b/inst/extdata/OSD/C/CAPULIN.json index 2a8179b469..a4ca35afe8 100644 --- a/inst/extdata/OSD/C/CAPULIN.json +++ b/inst/extdata/OSD/C/CAPULIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CARBIKA.json b/inst/extdata/OSD/C/CARBIKA.json index 4b14ae7260..6fbe29e1b2 100644 --- a/inst/extdata/OSD/C/CARBIKA.json +++ b/inst/extdata/OSD/C/CARBIKA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CARDIFF.json b/inst/extdata/OSD/C/CARDIFF.json index 70b3550305..33ca6fdf4f 100644 --- a/inst/extdata/OSD/C/CARDIFF.json +++ b/inst/extdata/OSD/C/CARDIFF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CARGILL.json b/inst/extdata/OSD/C/CARGILL.json index 4ec6f45eab..7345e63012 100644 --- a/inst/extdata/OSD/C/CARGILL.json +++ b/inst/extdata/OSD/C/CARGILL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CARIBOUCREEK.json b/inst/extdata/OSD/C/CARIBOUCREEK.json index 76e748441d..47306a4990 100644 --- a/inst/extdata/OSD/C/CARIBOUCREEK.json +++ b/inst/extdata/OSD/C/CARIBOUCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CARLITO.json b/inst/extdata/OSD/C/CARLITO.json index e13ba83a74..f1cc7e9c91 100644 --- a/inst/extdata/OSD/C/CARLITO.json +++ b/inst/extdata/OSD/C/CARLITO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CARLSBAD.json b/inst/extdata/OSD/C/CARLSBAD.json index c0561ec6c0..fbb4250244 100644 --- a/inst/extdata/OSD/C/CARLSBAD.json +++ b/inst/extdata/OSD/C/CARLSBAD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CARMODY.json b/inst/extdata/OSD/C/CARMODY.json index 5c2fba9951..8c9a6c362b 100644 --- a/inst/extdata/OSD/C/CARMODY.json +++ b/inst/extdata/OSD/C/CARMODY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CARR.json b/inst/extdata/OSD/C/CARR.json index 08d61c3224..30ec5e715a 100644 --- a/inst/extdata/OSD/C/CARR.json +++ b/inst/extdata/OSD/C/CARR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CARROLLTON.json b/inst/extdata/OSD/C/CARROLLTON.json index bbe768385e..3f105423bd 100644 --- a/inst/extdata/OSD/C/CARROLLTON.json +++ b/inst/extdata/OSD/C/CARROLLTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well and well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CARTER.json b/inst/extdata/OSD/C/CARTER.json index f94caa76e3..8651eed17a 100644 --- a/inst/extdata/OSD/C/CARTER.json +++ b/inst/extdata/OSD/C/CARTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CARUSO.json b/inst/extdata/OSD/C/CARUSO.json index 3bdc3952d4..386f48b8e6 100644 --- a/inst/extdata/OSD/C/CARUSO.json +++ b/inst/extdata/OSD/C/CARUSO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/CARWAY.json b/inst/extdata/OSD/C/CARWAY.json index 12fc886863..663e12c3da 100644 --- a/inst/extdata/OSD/C/CARWAY.json +++ b/inst/extdata/OSD/C/CARWAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/CARYVILLE.json b/inst/extdata/OSD/C/CARYVILLE.json index 134921ffb8..c89676de4a 100644 --- a/inst/extdata/OSD/C/CARYVILLE.json +++ b/inst/extdata/OSD/C/CARYVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CASTAIC.json b/inst/extdata/OSD/C/CASTAIC.json index 3ad9f799ca..84b68b09aa 100644 --- a/inst/extdata/OSD/C/CASTAIC.json +++ b/inst/extdata/OSD/C/CASTAIC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CASTEPHEN.json b/inst/extdata/OSD/C/CASTEPHEN.json index a7ab7420e4..9af393f543 100644 --- a/inst/extdata/OSD/C/CASTEPHEN.json +++ b/inst/extdata/OSD/C/CASTEPHEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CASTO.json b/inst/extdata/OSD/C/CASTO.json index 70dace543a..13de7dc95c 100644 --- a/inst/extdata/OSD/C/CASTO.json +++ b/inst/extdata/OSD/C/CASTO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CASUSE.json b/inst/extdata/OSD/C/CASUSE.json index a7c0edbed8..19d5e9c6f3 100644 --- a/inst/extdata/OSD/C/CASUSE.json +++ b/inst/extdata/OSD/C/CASUSE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CATALPA.json b/inst/extdata/OSD/C/CATALPA.json index 72f321d933..d29daf715e 100644 --- a/inst/extdata/OSD/C/CATALPA.json +++ b/inst/extdata/OSD/C/CATALPA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly to moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CATAMOUNT.json b/inst/extdata/OSD/C/CATAMOUNT.json index 3db85991a1..f5161eaeac 100644 --- a/inst/extdata/OSD/C/CATAMOUNT.json +++ b/inst/extdata/OSD/C/CATAMOUNT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively or somewhat excessively", - "drainage_overview": "excessively or somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/C/CATHEDRAL.json b/inst/extdata/OSD/C/CATHEDRAL.json index 9b5769a577..f48f0e0d5e 100644 --- a/inst/extdata/OSD/C/CATHEDRAL.json +++ b/inst/extdata/OSD/C/CATHEDRAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CATUNA.json b/inst/extdata/OSD/C/CATUNA.json index 96f4bacd89..6f92ec2c61 100644 --- a/inst/extdata/OSD/C/CATUNA.json +++ b/inst/extdata/OSD/C/CATUNA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/C/CAVAL.json b/inst/extdata/OSD/C/CAVAL.json index c872a08513..de354d95a4 100644 --- a/inst/extdata/OSD/C/CAVAL.json +++ b/inst/extdata/OSD/C/CAVAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CAVENDISH.json b/inst/extdata/OSD/C/CAVENDISH.json index 211871e91e..0b2bf94513 100644 --- a/inst/extdata/OSD/C/CAVENDISH.json +++ b/inst/extdata/OSD/C/CAVENDISH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CAVESPRING.json b/inst/extdata/OSD/C/CAVESPRING.json index d5bc3c6229..22d37cf2ee 100644 --- a/inst/extdata/OSD/C/CAVESPRING.json +++ b/inst/extdata/OSD/C/CAVESPRING.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CAVOUR.json b/inst/extdata/OSD/C/CAVOUR.json index 0146458122..f2b7e9135b 100644 --- a/inst/extdata/OSD/C/CAVOUR.json +++ b/inst/extdata/OSD/C/CAVOUR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CEBANA.json b/inst/extdata/OSD/C/CEBANA.json index e8eaa49eec..f8dae447ff 100644 --- a/inst/extdata/OSD/C/CEBANA.json +++ b/inst/extdata/OSD/C/CEBANA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CELESTE.json b/inst/extdata/OSD/C/CELESTE.json index 176766a9fa..1b988aee64 100644 --- a/inst/extdata/OSD/C/CELESTE.json +++ b/inst/extdata/OSD/C/CELESTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CENCOVE.json b/inst/extdata/OSD/C/CENCOVE.json index 6adbfea1e4..6cb777c3ae 100644 --- a/inst/extdata/OSD/C/CENCOVE.json +++ b/inst/extdata/OSD/C/CENCOVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CENTENARY.json b/inst/extdata/OSD/C/CENTENARY.json index c4263ddac0..f87b28d011 100644 --- a/inst/extdata/OSD/C/CENTENARY.json +++ b/inst/extdata/OSD/C/CENTENARY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CENTER.json b/inst/extdata/OSD/C/CENTER.json index a797f50b68..6eac9b9569 100644 --- a/inst/extdata/OSD/C/CENTER.json +++ b/inst/extdata/OSD/C/CENTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CENTINELA.json b/inst/extdata/OSD/C/CENTINELA.json index 2bd018cd20..d049e9d74a 100644 --- a/inst/extdata/OSD/C/CENTINELA.json +++ b/inst/extdata/OSD/C/CENTINELA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CERLIN.json b/inst/extdata/OSD/C/CERLIN.json index 34c4eb708f..18a317da86 100644 --- a/inst/extdata/OSD/C/CERLIN.json +++ b/inst/extdata/OSD/C/CERLIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CERRILLOS.json b/inst/extdata/OSD/C/CERRILLOS.json index ef32d34d2b..c24633cdca 100644 --- a/inst/extdata/OSD/C/CERRILLOS.json +++ b/inst/extdata/OSD/C/CERRILLOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CERRO.json b/inst/extdata/OSD/C/CERRO.json index 3aa009e9fe..3cc0da7d4a 100644 --- a/inst/extdata/OSD/C/CERRO.json +++ b/inst/extdata/OSD/C/CERRO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CESTNIK.json b/inst/extdata/OSD/C/CESTNIK.json index 16a74fd9f1..26ab36179b 100644 --- a/inst/extdata/OSD/C/CESTNIK.json +++ b/inst/extdata/OSD/C/CESTNIK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CHAFFEE.json b/inst/extdata/OSD/C/CHAFFEE.json index dbd4662754..f2c8ca689c 100644 --- a/inst/extdata/OSD/C/CHAFFEE.json +++ b/inst/extdata/OSD/C/CHAFFEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHAIRES.json b/inst/extdata/OSD/C/CHAIRES.json index f9d1ec8d7a..bf533bb475 100644 --- a/inst/extdata/OSD/C/CHAIRES.json +++ b/inst/extdata/OSD/C/CHAIRES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHAMBERINO.json b/inst/extdata/OSD/C/CHAMBERINO.json index a4b6edd62e..c989c4aad5 100644 --- a/inst/extdata/OSD/C/CHAMBERINO.json +++ b/inst/extdata/OSD/C/CHAMBERINO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CHAMPION.json b/inst/extdata/OSD/C/CHAMPION.json index 5cd1d34a10..4beae4bc6e 100644 --- a/inst/extdata/OSD/C/CHAMPION.json +++ b/inst/extdata/OSD/C/CHAMPION.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHAMPLAIN.json b/inst/extdata/OSD/C/CHAMPLAIN.json index 4912a08855..e143d6f89a 100644 --- a/inst/extdata/OSD/C/CHAMPLAIN.json +++ b/inst/extdata/OSD/C/CHAMPLAIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively and somewhat excessively", - "drainage_overview": "excessively to somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/C/CHANCE.json b/inst/extdata/OSD/C/CHANCE.json index 5be0cb0115..f60567f639 100644 --- a/inst/extdata/OSD/C/CHANCE.json +++ b/inst/extdata/OSD/C/CHANCE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CHANCELLOR.json b/inst/extdata/OSD/C/CHANCELLOR.json index 98e99fae73..1cd084ea73 100644 --- a/inst/extdata/OSD/C/CHANCELLOR.json +++ b/inst/extdata/OSD/C/CHANCELLOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHANTILLY.json b/inst/extdata/OSD/C/CHANTILLY.json index fe7a329198..1a6cb7c925 100644 --- a/inst/extdata/OSD/C/CHANTILLY.json +++ b/inst/extdata/OSD/C/CHANTILLY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CHARITY.json b/inst/extdata/OSD/C/CHARITY.json index 135e57ebae..5f7d97f7df 100644 --- a/inst/extdata/OSD/C/CHARITY.json +++ b/inst/extdata/OSD/C/CHARITY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHARLOS.json b/inst/extdata/OSD/C/CHARLOS.json index 84bc9884af..2ea1317e56 100644 --- a/inst/extdata/OSD/C/CHARLOS.json +++ b/inst/extdata/OSD/C/CHARLOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CHASE.json b/inst/extdata/OSD/C/CHASE.json index f685e99743..57ba306749 100644 --- a/inst/extdata/OSD/C/CHASE.json +++ b/inst/extdata/OSD/C/CHASE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHATHAM.json b/inst/extdata/OSD/C/CHATHAM.json index 8abf122ca8..2ff7982313 100644 --- a/inst/extdata/OSD/C/CHATHAM.json +++ b/inst/extdata/OSD/C/CHATHAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHAUSSE.json b/inst/extdata/OSD/C/CHAUSSE.json index 75355d9cec..3986d620af 100644 --- a/inst/extdata/OSD/C/CHAUSSE.json +++ b/inst/extdata/OSD/C/CHAUSSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CHEBOYGAN.json b/inst/extdata/OSD/C/CHEBOYGAN.json index 196c2e7f2c..d2f273cb08 100644 --- a/inst/extdata/OSD/C/CHEBOYGAN.json +++ b/inst/extdata/OSD/C/CHEBOYGAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHEEKTOWAGA.json b/inst/extdata/OSD/C/CHEEKTOWAGA.json index b63866ff16..46de291839 100644 --- a/inst/extdata/OSD/C/CHEEKTOWAGA.json +++ b/inst/extdata/OSD/C/CHEEKTOWAGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHENANGO.json b/inst/extdata/OSD/C/CHENANGO.json index c5c749eeac..faac10a88f 100644 --- a/inst/extdata/OSD/C/CHENANGO.json +++ b/inst/extdata/OSD/C/CHENANGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CHESTERTON.json b/inst/extdata/OSD/C/CHESTERTON.json index 571b78b3b9..d9ff7d03b9 100644 --- a/inst/extdata/OSD/C/CHESTERTON.json +++ b/inst/extdata/OSD/C/CHESTERTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "moderately well", + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHIEFLAND.json b/inst/extdata/OSD/C/CHIEFLAND.json index 19cb0a73ad..6c6c8cd685 100644 --- a/inst/extdata/OSD/C/CHIEFLAND.json +++ b/inst/extdata/OSD/C/CHIEFLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHILKOOT.json b/inst/extdata/OSD/C/CHILKOOT.json index 7bc0a44f02..e927269255 100644 --- a/inst/extdata/OSD/C/CHILKOOT.json +++ b/inst/extdata/OSD/C/CHILKOOT.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHILSON.json b/inst/extdata/OSD/C/CHILSON.json index 66069f3d71..9fc8878335 100644 --- a/inst/extdata/OSD/C/CHILSON.json +++ b/inst/extdata/OSD/C/CHILSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CHINCHALLO.json b/inst/extdata/OSD/C/CHINCHALLO.json index ac9393f2a6..374ae77580 100644 --- a/inst/extdata/OSD/C/CHINCHALLO.json +++ b/inst/extdata/OSD/C/CHINCHALLO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHINO.json b/inst/extdata/OSD/C/CHINO.json index cdb965a8f4..eb4a78e98a 100644 --- a/inst/extdata/OSD/C/CHINO.json +++ b/inst/extdata/OSD/C/CHINO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CHIPPEWA.json b/inst/extdata/OSD/C/CHIPPEWA.json index cff9a1ac18..7f166253e0 100644 --- a/inst/extdata/OSD/C/CHIPPEWA.json +++ b/inst/extdata/OSD/C/CHIPPEWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHRISTIAN.json b/inst/extdata/OSD/C/CHRISTIAN.json index 454bb1c90c..0d7beff70f 100644 --- a/inst/extdata/OSD/C/CHRISTIAN.json +++ b/inst/extdata/OSD/C/CHRISTIAN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CHRISTIANBURG.json b/inst/extdata/OSD/C/CHRISTIANBURG.json index dd42f2e8a7..9c769a57b8 100644 --- a/inst/extdata/OSD/C/CHRISTIANBURG.json +++ b/inst/extdata/OSD/C/CHRISTIANBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CHUBBFLAT.json b/inst/extdata/OSD/C/CHUBBFLAT.json index 6af4326364..0add6dac33 100644 --- a/inst/extdata/OSD/C/CHUBBFLAT.json +++ b/inst/extdata/OSD/C/CHUBBFLAT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/CHUGTER.json b/inst/extdata/OSD/C/CHUGTER.json index a05416d2d8..459b5eb699 100644 --- a/inst/extdata/OSD/C/CHUGTER.json +++ b/inst/extdata/OSD/C/CHUGTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CHUMMY.json b/inst/extdata/OSD/C/CHUMMY.json index 9117ae49fd..ef5a2683da 100644 --- a/inst/extdata/OSD/C/CHUMMY.json +++ b/inst/extdata/OSD/C/CHUMMY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CHUNILNA.json b/inst/extdata/OSD/C/CHUNILNA.json index f665715ae8..a63097dd07 100644 --- a/inst/extdata/OSD/C/CHUNILNA.json +++ b/inst/extdata/OSD/C/CHUNILNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CHURCH.json b/inst/extdata/OSD/C/CHURCH.json index 81ff3a8ed9..7836cef429 100644 --- a/inst/extdata/OSD/C/CHURCH.json +++ b/inst/extdata/OSD/C/CHURCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CHURN.json b/inst/extdata/OSD/C/CHURN.json index 712152e65b..81490493f1 100644 --- a/inst/extdata/OSD/C/CHURN.json +++ b/inst/extdata/OSD/C/CHURN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CID.json b/inst/extdata/OSD/C/CID.json index a7283d334b..4fe28d0a21 100644 --- a/inst/extdata/OSD/C/CID.json +++ b/inst/extdata/OSD/C/CID.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CIENO.json b/inst/extdata/OSD/C/CIENO.json index dad76514f1..986d11026d 100644 --- a/inst/extdata/OSD/C/CIENO.json +++ b/inst/extdata/OSD/C/CIENO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CINDERHURST.json b/inst/extdata/OSD/C/CINDERHURST.json index e86e1a7ffd..fca82cb71e 100644 --- a/inst/extdata/OSD/C/CINDERHURST.json +++ b/inst/extdata/OSD/C/CINDERHURST.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CINDERSPRING.json b/inst/extdata/OSD/C/CINDERSPRING.json index 9c41598ff9..b5f55efab0 100644 --- a/inst/extdata/OSD/C/CINDERSPRING.json +++ b/inst/extdata/OSD/C/CINDERSPRING.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CIPRE.json b/inst/extdata/OSD/C/CIPRE.json index f5dbdefca1..dc83713d0b 100644 --- a/inst/extdata/OSD/C/CIPRE.json +++ b/inst/extdata/OSD/C/CIPRE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/C/CIRCLEVILLE.json b/inst/extdata/OSD/C/CIRCLEVILLE.json index 8d8beef539..7e48179a36 100644 --- a/inst/extdata/OSD/C/CIRCLEVILLE.json +++ b/inst/extdata/OSD/C/CIRCLEVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CLAIRETTE.json b/inst/extdata/OSD/C/CLAIRETTE.json index d5979e0559..f079d10ede 100644 --- a/inst/extdata/OSD/C/CLAIRETTE.json +++ b/inst/extdata/OSD/C/CLAIRETTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CLAPHAM.json b/inst/extdata/OSD/C/CLAPHAM.json index 2996fefdfd..16d6cd4508 100644 --- a/inst/extdata/OSD/C/CLAPHAM.json +++ b/inst/extdata/OSD/C/CLAPHAM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CLARA.json b/inst/extdata/OSD/C/CLARA.json index 240d20f89f..29edb9f76e 100644 --- a/inst/extdata/OSD/C/CLARA.json +++ b/inst/extdata/OSD/C/CLARA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CLARKELEN.json b/inst/extdata/OSD/C/CLARKELEN.json index 464479e75f..6858ed966f 100644 --- a/inst/extdata/OSD/C/CLARKELEN.json +++ b/inst/extdata/OSD/C/CLARKELEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat excessively", - "drainage_overview": "moderately well or somewhat excessively" + "drainage": "somewhat excessively, well, moderately well", + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CLARNO.json b/inst/extdata/OSD/C/CLARNO.json index fdabd25baa..ec8a1d715f 100644 --- a/inst/extdata/OSD/C/CLARNO.json +++ b/inst/extdata/OSD/C/CLARNO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CLATO.json b/inst/extdata/OSD/C/CLATO.json index 36601e637c..03d7953e92 100644 --- a/inst/extdata/OSD/C/CLATO.json +++ b/inst/extdata/OSD/C/CLATO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CLEARWATER.json b/inst/extdata/OSD/C/CLEARWATER.json index f15d1d8511..d4b018f298 100644 --- a/inst/extdata/OSD/C/CLEARWATER.json +++ b/inst/extdata/OSD/C/CLEARWATER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CLEMENTSVILLE.json b/inst/extdata/OSD/C/CLEMENTSVILLE.json index 36984daa14..2077eb4545 100644 --- a/inst/extdata/OSD/C/CLEMENTSVILLE.json +++ b/inst/extdata/OSD/C/CLEMENTSVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CLIFFHOUSE.json b/inst/extdata/OSD/C/CLIFFHOUSE.json index 46a647595f..52639a2f33 100644 --- a/inst/extdata/OSD/C/CLIFFHOUSE.json +++ b/inst/extdata/OSD/C/CLIFFHOUSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CLIFTERSON.json b/inst/extdata/OSD/C/CLIFTERSON.json index ba0abc0325..3319413ed2 100644 --- a/inst/extdata/OSD/C/CLIFTERSON.json +++ b/inst/extdata/OSD/C/CLIFTERSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/C/CLIFTY.json b/inst/extdata/OSD/C/CLIFTY.json index 1a79647401..1ba7dc89b5 100644 --- a/inst/extdata/OSD/C/CLIFTY.json +++ b/inst/extdata/OSD/C/CLIFTY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CLIMARA.json b/inst/extdata/OSD/C/CLIMARA.json index 5acddc5c86..4de4916abe 100644 --- a/inst/extdata/OSD/C/CLIMARA.json +++ b/inst/extdata/OSD/C/CLIMARA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CLIME.json b/inst/extdata/OSD/C/CLIME.json index a172e19bd2..755fbc4788 100644 --- a/inst/extdata/OSD/C/CLIME.json +++ b/inst/extdata/OSD/C/CLIME.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CLINGMAN.json b/inst/extdata/OSD/C/CLINGMAN.json index 7cee5c51d5..303f132c9a 100644 --- a/inst/extdata/OSD/C/CLINGMAN.json +++ b/inst/extdata/OSD/C/CLINGMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CLODINE.json b/inst/extdata/OSD/C/CLODINE.json index f5690bf4aa..df5c511f56 100644 --- a/inst/extdata/OSD/C/CLODINE.json +++ b/inst/extdata/OSD/C/CLODINE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/CLOQUATO.json b/inst/extdata/OSD/C/CLOQUATO.json index 5b992ed746..bdc5bf3979 100644 --- a/inst/extdata/OSD/C/CLOQUATO.json +++ b/inst/extdata/OSD/C/CLOQUATO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CLOUGH.json b/inst/extdata/OSD/C/CLOUGH.json index be73645c6e..eccb04ca55 100644 --- a/inst/extdata/OSD/C/CLOUGH.json +++ b/inst/extdata/OSD/C/CLOUGH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CLOVER_SPRINGS.json b/inst/extdata/OSD/C/CLOVER_SPRINGS.json index 1c4d2320c6..a1daaeb707 100644 --- a/inst/extdata/OSD/C/CLOVER_SPRINGS.json +++ b/inst/extdata/OSD/C/CLOVER_SPRINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CLOWERS.json b/inst/extdata/OSD/C/CLOWERS.json index b98d515428..18c0ba0de6 100644 --- a/inst/extdata/OSD/C/CLOWERS.json +++ b/inst/extdata/OSD/C/CLOWERS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CLYDE.json b/inst/extdata/OSD/C/CLYDE.json index e2debbc04f..d085e1ef6f 100644 --- a/inst/extdata/OSD/C/CLYDE.json +++ b/inst/extdata/OSD/C/CLYDE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COACHELLA.json b/inst/extdata/OSD/C/COACHELLA.json index 44052008f9..7819387744 100644 --- a/inst/extdata/OSD/C/COACHELLA.json +++ b/inst/extdata/OSD/C/COACHELLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COALIAMS.json b/inst/extdata/OSD/C/COALIAMS.json index 049287906c..1811a686c7 100644 --- a/inst/extdata/OSD/C/COALIAMS.json +++ b/inst/extdata/OSD/C/COALIAMS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/COALVALE.json b/inst/extdata/OSD/C/COALVALE.json index aa439c819b..4532409e9b 100644 --- a/inst/extdata/OSD/C/COALVALE.json +++ b/inst/extdata/OSD/C/COALVALE.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/COARDS.json b/inst/extdata/OSD/C/COARDS.json index 833fedcff7..c3ed49a1a2 100644 --- a/inst/extdata/OSD/C/COARDS.json +++ b/inst/extdata/OSD/C/COARDS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/C/COBBLETOP.json b/inst/extdata/OSD/C/COBBLETOP.json index f4479b3d4c..56d4542290 100644 --- a/inst/extdata/OSD/C/COBBLETOP.json +++ b/inst/extdata/OSD/C/COBBLETOP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/COBEY.json b/inst/extdata/OSD/C/COBEY.json index 5e3db9989f..a30cc093d1 100644 --- a/inst/extdata/OSD/C/COBEY.json +++ b/inst/extdata/OSD/C/COBEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CODORUS.json b/inst/extdata/OSD/C/CODORUS.json index 27994707bc..72081bb3c6 100644 --- a/inst/extdata/OSD/C/CODORUS.json +++ b/inst/extdata/OSD/C/CODORUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/COHAGEN.json b/inst/extdata/OSD/C/COHAGEN.json index e80dc1820b..8299cca05c 100644 --- a/inst/extdata/OSD/C/COHAGEN.json +++ b/inst/extdata/OSD/C/COHAGEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COHOCTAH.json b/inst/extdata/OSD/C/COHOCTAH.json index 7e5003d38d..5706998568 100644 --- a/inst/extdata/OSD/C/COHOCTAH.json +++ b/inst/extdata/OSD/C/COHOCTAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COKEVILLE.json b/inst/extdata/OSD/C/COKEVILLE.json index ad7d9d2f29..755efccbeb 100644 --- a/inst/extdata/OSD/C/COKEVILLE.json +++ b/inst/extdata/OSD/C/COKEVILLE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COLBY.json b/inst/extdata/OSD/C/COLBY.json index 02b081988a..229737868f 100644 --- a/inst/extdata/OSD/C/COLBY.json +++ b/inst/extdata/OSD/C/COLBY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COLDCREEK.json b/inst/extdata/OSD/C/COLDCREEK.json index 866a79f4ba..35dc6f2743 100644 --- a/inst/extdata/OSD/C/COLDCREEK.json +++ b/inst/extdata/OSD/C/COLDCREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COLLEGIATE.json b/inst/extdata/OSD/C/COLLEGIATE.json index 8290e482b8..19ac736bcf 100644 --- a/inst/extdata/OSD/C/COLLEGIATE.json +++ b/inst/extdata/OSD/C/COLLEGIATE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/COLLINSVILLE.json b/inst/extdata/OSD/C/COLLINSVILLE.json index d9bf39129b..5c4e444de5 100644 --- a/inst/extdata/OSD/C/COLLINSVILLE.json +++ b/inst/extdata/OSD/C/COLLINSVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COLMOR.json b/inst/extdata/OSD/C/COLMOR.json index 688974384d..1f6d278898 100644 --- a/inst/extdata/OSD/C/COLMOR.json +++ b/inst/extdata/OSD/C/COLMOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/COLOMA.json b/inst/extdata/OSD/C/COLOMA.json index 39154af70d..b870ba435a 100644 --- a/inst/extdata/OSD/C/COLOMA.json +++ b/inst/extdata/OSD/C/COLOMA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/C/COLONIE.json b/inst/extdata/OSD/C/COLONIE.json index e7de3ac976..6873939183 100644 --- a/inst/extdata/OSD/C/COLONIE.json +++ b/inst/extdata/OSD/C/COLONIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COLOROCK.json b/inst/extdata/OSD/C/COLOROCK.json index c999c44171..b8c7ec3031 100644 --- a/inst/extdata/OSD/C/COLOROCK.json +++ b/inst/extdata/OSD/C/COLOROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/COLOSSE.json b/inst/extdata/OSD/C/COLOSSE.json index 34560612a7..a3c9b9325b 100644 --- a/inst/extdata/OSD/C/COLOSSE.json +++ b/inst/extdata/OSD/C/COLOSSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively and somewhat excessively", - "drainage_overview": "excessively and somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/C/COLVIN.json b/inst/extdata/OSD/C/COLVIN.json index 36c010fedb..9212969808 100644 --- a/inst/extdata/OSD/C/COLVIN.json +++ b/inst/extdata/OSD/C/COLVIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COLWOOD.json b/inst/extdata/OSD/C/COLWOOD.json index 7135f37e03..1419520098 100644 --- a/inst/extdata/OSD/C/COLWOOD.json +++ b/inst/extdata/OSD/C/COLWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COLY.json b/inst/extdata/OSD/C/COLY.json index 6afd809d7c..8bd0b9e8fd 100644 --- a/inst/extdata/OSD/C/COLY.json +++ b/inst/extdata/OSD/C/COLY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COMETA.json b/inst/extdata/OSD/C/COMETA.json index 63cf61b416..435f65167d 100644 --- a/inst/extdata/OSD/C/COMETA.json +++ b/inst/extdata/OSD/C/COMETA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/COMFORT.json b/inst/extdata/OSD/C/COMFORT.json index e3c2f989e7..b2d8965dca 100644 --- a/inst/extdata/OSD/C/COMFORT.json +++ b/inst/extdata/OSD/C/COMFORT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COMFREY.json b/inst/extdata/OSD/C/COMFREY.json index 5b0592f3ef..25a1323745 100644 --- a/inst/extdata/OSD/C/COMFREY.json +++ b/inst/extdata/OSD/C/COMFREY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COMODORE.json b/inst/extdata/OSD/C/COMODORE.json index 18feb62aa7..391252e257 100644 --- a/inst/extdata/OSD/C/COMODORE.json +++ b/inst/extdata/OSD/C/COMODORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CONANT.json b/inst/extdata/OSD/C/CONANT.json index e2a9450bba..246ad88fc8 100644 --- a/inst/extdata/OSD/C/CONANT.json +++ b/inst/extdata/OSD/C/CONANT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CONCEPCION.json b/inst/extdata/OSD/C/CONCEPCION.json index 4a8deee948..80035716a2 100644 --- a/inst/extdata/OSD/C/CONCEPCION.json +++ b/inst/extdata/OSD/C/CONCEPCION.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CONE.json b/inst/extdata/OSD/C/CONE.json index df1f992d31..f5ea7544ec 100644 --- a/inst/extdata/OSD/C/CONE.json +++ b/inst/extdata/OSD/C/CONE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CONGAREE.json b/inst/extdata/OSD/C/CONGAREE.json index 6acba2af8f..4b94e27547 100644 --- a/inst/extdata/OSD/C/CONGAREE.json +++ b/inst/extdata/OSD/C/CONGAREE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CONI.json b/inst/extdata/OSD/C/CONI.json index e6d7988671..b14810c941 100644 --- a/inst/extdata/OSD/C/CONI.json +++ b/inst/extdata/OSD/C/CONI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CONNEAUT.json b/inst/extdata/OSD/C/CONNEAUT.json index bf3d5bf81d..3c47f3aa22 100644 --- a/inst/extdata/OSD/C/CONNEAUT.json +++ b/inst/extdata/OSD/C/CONNEAUT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CONNER.json b/inst/extdata/OSD/C/CONNER.json index d96d8dbf66..425b4b5b12 100644 --- a/inst/extdata/OSD/C/CONNER.json +++ b/inst/extdata/OSD/C/CONNER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CONNERIDGE.json b/inst/extdata/OSD/C/CONNERIDGE.json index aa9cdf24c5..6ce4e964e3 100644 --- a/inst/extdata/OSD/C/CONNERIDGE.json +++ b/inst/extdata/OSD/C/CONNERIDGE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CONOTTON.json b/inst/extdata/OSD/C/CONOTTON.json index e0fab6f5d7..b1eae0afe7 100644 --- a/inst/extdata/OSD/C/CONOTTON.json +++ b/inst/extdata/OSD/C/CONOTTON.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CONOWINGO.json b/inst/extdata/OSD/C/CONOWINGO.json index 5daf0ea5b4..a10d65989a 100644 --- a/inst/extdata/OSD/C/CONOWINGO.json +++ b/inst/extdata/OSD/C/CONOWINGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CONROE.json b/inst/extdata/OSD/C/CONROE.json index 2911458fa7..f9dec8fd78 100644 --- a/inst/extdata/OSD/C/CONROE.json +++ b/inst/extdata/OSD/C/CONROE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/C/CONTEE.json b/inst/extdata/OSD/C/CONTEE.json index b3cdd01bcb..7306abc2d2 100644 --- a/inst/extdata/OSD/C/CONTEE.json +++ b/inst/extdata/OSD/C/CONTEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CONTEES_WHARF.json b/inst/extdata/OSD/C/CONTEES_WHARF.json index f210cbb415..495e6f7a89 100644 --- a/inst/extdata/OSD/C/CONTEES_WHARF.json +++ b/inst/extdata/OSD/C/CONTEES_WHARF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/C/CONTIDE.json b/inst/extdata/OSD/C/CONTIDE.json index deff7dd315..fed23b9e19 100644 --- a/inst/extdata/OSD/C/CONTIDE.json +++ b/inst/extdata/OSD/C/CONTIDE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CONTRA_COSTA.json b/inst/extdata/OSD/C/CONTRA_COSTA.json index 167060e4e5..670cf7a2d4 100644 --- a/inst/extdata/OSD/C/CONTRA_COSTA.json +++ b/inst/extdata/OSD/C/CONTRA_COSTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COOK.json b/inst/extdata/OSD/C/COOK.json index 7a40aba8a3..ec4ced8f68 100644 --- a/inst/extdata/OSD/C/COOK.json +++ b/inst/extdata/OSD/C/COOK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/C/COOKCREEK.json b/inst/extdata/OSD/C/COOKCREEK.json index 81ee5622e4..8d2c5608d5 100644 --- a/inst/extdata/OSD/C/COOKCREEK.json +++ b/inst/extdata/OSD/C/COOKCREEK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COOMBS.json b/inst/extdata/OSD/C/COOMBS.json index 66469a1958..38ef44fca9 100644 --- a/inst/extdata/OSD/C/COOMBS.json +++ b/inst/extdata/OSD/C/COOMBS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CORA.json b/inst/extdata/OSD/C/CORA.json index 8f87c3c4b3..25531b667c 100644 --- a/inst/extdata/OSD/C/CORA.json +++ b/inst/extdata/OSD/C/CORA.json @@ -65,7 +65,7 @@ [ { "drainage": "very poorly", - "drainage_overview": "very poorly or poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CORDES.json b/inst/extdata/OSD/C/CORDES.json index 1d88437427..22ac34ec8f 100644 --- a/inst/extdata/OSD/C/CORDES.json +++ b/inst/extdata/OSD/C/CORDES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COREE.json b/inst/extdata/OSD/C/COREE.json index aa0b4f2617..5b5500cef9 100644 --- a/inst/extdata/OSD/C/COREE.json +++ b/inst/extdata/OSD/C/COREE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/C/CORMANT.json b/inst/extdata/OSD/C/CORMANT.json index 4a46ac8a56..d17c7c0b8a 100644 --- a/inst/extdata/OSD/C/CORMANT.json +++ b/inst/extdata/OSD/C/CORMANT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CORNING.json b/inst/extdata/OSD/C/CORNING.json index ddf1e6d856..8b92d0356d 100644 --- a/inst/extdata/OSD/C/CORNING.json +++ b/inst/extdata/OSD/C/CORNING.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well or moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CORNVILLE.json b/inst/extdata/OSD/C/CORNVILLE.json index 1349e9ba8c..9f2ad037a7 100644 --- a/inst/extdata/OSD/C/CORNVILLE.json +++ b/inst/extdata/OSD/C/CORNVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COROLLA.json b/inst/extdata/OSD/C/COROLLA.json index c984d84a46..4683e21f85 100644 --- a/inst/extdata/OSD/C/COROLLA.json +++ b/inst/extdata/OSD/C/COROLLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CORRECO.json b/inst/extdata/OSD/C/CORRECO.json index 749c509108..50c8686acd 100644 --- a/inst/extdata/OSD/C/CORRECO.json +++ b/inst/extdata/OSD/C/CORRECO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CORTLAND.json b/inst/extdata/OSD/C/CORTLAND.json index 879032d85a..60e966eaa2 100644 --- a/inst/extdata/OSD/C/CORTLAND.json +++ b/inst/extdata/OSD/C/CORTLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COSKI.json b/inst/extdata/OSD/C/COSKI.json index a3cb1cfac3..7c03b542cf 100644 --- a/inst/extdata/OSD/C/COSKI.json +++ b/inst/extdata/OSD/C/COSKI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COTACO.json b/inst/extdata/OSD/C/COTACO.json index 1ca0ff17e5..c03d61a2d2 100644 --- a/inst/extdata/OSD/C/COTACO.json +++ b/inst/extdata/OSD/C/COTACO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/COTAY.json b/inst/extdata/OSD/C/COTAY.json index c23a746974..03ff2029b6 100644 --- a/inst/extdata/OSD/C/COTAY.json +++ b/inst/extdata/OSD/C/COTAY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COTOPAXI.json b/inst/extdata/OSD/C/COTOPAXI.json index ddf82799be..7b3913c996 100644 --- a/inst/extdata/OSD/C/COTOPAXI.json +++ b/inst/extdata/OSD/C/COTOPAXI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COTTMAN.json b/inst/extdata/OSD/C/COTTMAN.json index 69de2bed37..ec0a4920d2 100644 --- a/inst/extdata/OSD/C/COTTMAN.json +++ b/inst/extdata/OSD/C/COTTMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/C/COTTONEVA.json b/inst/extdata/OSD/C/COTTONEVA.json index 6ee1b9e118..af2ad7982b 100644 --- a/inst/extdata/OSD/C/COTTONEVA.json +++ b/inst/extdata/OSD/C/COTTONEVA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/COTTONTHOMAS.json b/inst/extdata/OSD/C/COTTONTHOMAS.json index 4da76f57e4..828fed11e8 100644 --- a/inst/extdata/OSD/C/COTTONTHOMAS.json +++ b/inst/extdata/OSD/C/COTTONTHOMAS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COTTONWOOD.json b/inst/extdata/OSD/C/COTTONWOOD.json index 3159b21379..a64bbe1d13 100644 --- a/inst/extdata/OSD/C/COTTONWOOD.json +++ b/inst/extdata/OSD/C/COTTONWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COUCH.json b/inst/extdata/OSD/C/COUCH.json index 19ab2b1608..6225a7999d 100644 --- a/inst/extdata/OSD/C/COUCH.json +++ b/inst/extdata/OSD/C/COUCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COUCHSACHRAGA.json b/inst/extdata/OSD/C/COUCHSACHRAGA.json index 0b0fcdacf6..58c351725e 100644 --- a/inst/extdata/OSD/C/COUCHSACHRAGA.json +++ b/inst/extdata/OSD/C/COUCHSACHRAGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/C/COUNCELOR.json b/inst/extdata/OSD/C/COUNCELOR.json index 87efb419a8..011c369157 100644 --- a/inst/extdata/OSD/C/COUNCELOR.json +++ b/inst/extdata/OSD/C/COUNCELOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COUNTERFEIT.json b/inst/extdata/OSD/C/COUNTERFEIT.json index b44694110a..537f34180f 100644 --- a/inst/extdata/OSD/C/COUNTERFEIT.json +++ b/inst/extdata/OSD/C/COUNTERFEIT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/COUNTRYMAN.json b/inst/extdata/OSD/C/COUNTRYMAN.json index f5e838586d..1636911438 100644 --- a/inst/extdata/OSD/C/COUNTRYMAN.json +++ b/inst/extdata/OSD/C/COUNTRYMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/COURT.json b/inst/extdata/OSD/C/COURT.json index b5127c5931..c90d288af1 100644 --- a/inst/extdata/OSD/C/COURT.json +++ b/inst/extdata/OSD/C/COURT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/COVE.json b/inst/extdata/OSD/C/COVE.json index a214212605..ad2d5a2bd2 100644 --- a/inst/extdata/OSD/C/COVE.json +++ b/inst/extdata/OSD/C/COVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/COVILLE.json b/inst/extdata/OSD/C/COVILLE.json index 8d651f9fbb..f45fe9a757 100644 --- a/inst/extdata/OSD/C/COVILLE.json +++ b/inst/extdata/OSD/C/COVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/COWAN.json b/inst/extdata/OSD/C/COWAN.json index ba2b7d5e58..7c8fe837ae 100644 --- a/inst/extdata/OSD/C/COWAN.json +++ b/inst/extdata/OSD/C/COWAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COWARTS.json b/inst/extdata/OSD/C/COWARTS.json index 1ac7fa5dc6..e9c69a7aeb 100644 --- a/inst/extdata/OSD/C/COWARTS.json +++ b/inst/extdata/OSD/C/COWARTS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/COWCAMP.json b/inst/extdata/OSD/C/COWCAMP.json index ee720a6fe7..3a779fa623 100644 --- a/inst/extdata/OSD/C/COWCAMP.json +++ b/inst/extdata/OSD/C/COWCAMP.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COWESTGLEN.json b/inst/extdata/OSD/C/COWESTGLEN.json index 8843b553dd..be424aaa66 100644 --- a/inst/extdata/OSD/C/COWESTGLEN.json +++ b/inst/extdata/OSD/C/COWESTGLEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/COWETA.json b/inst/extdata/OSD/C/COWETA.json index da975131ac..badf196a08 100644 --- a/inst/extdata/OSD/C/COWETA.json +++ b/inst/extdata/OSD/C/COWETA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/COXPIN.json b/inst/extdata/OSD/C/COXPIN.json index 0fd243fdaf..2ddcacbdc7 100644 --- a/inst/extdata/OSD/C/COXPIN.json +++ b/inst/extdata/OSD/C/COXPIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/C/COYNE.json b/inst/extdata/OSD/C/COYNE.json index 5cf53a386f..6a467cc1db 100644 --- a/inst/extdata/OSD/C/COYNE.json +++ b/inst/extdata/OSD/C/COYNE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/COYOTEBLUFF.json b/inst/extdata/OSD/C/COYOTEBLUFF.json index d54ba24f06..a5c51bd017 100644 --- a/inst/extdata/OSD/C/COYOTEBLUFF.json +++ b/inst/extdata/OSD/C/COYOTEBLUFF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/COZAD.json b/inst/extdata/OSD/C/COZAD.json index 625805db44..d5bdfb8d82 100644 --- a/inst/extdata/OSD/C/COZAD.json +++ b/inst/extdata/OSD/C/COZAD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CRAFT.json b/inst/extdata/OSD/C/CRAFT.json index ea7a6ad1b6..605ebf836c 100644 --- a/inst/extdata/OSD/C/CRAFT.json +++ b/inst/extdata/OSD/C/CRAFT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CRAGOLA.json b/inst/extdata/OSD/C/CRAGOLA.json index d3f0c95a95..b1fcd6f19b 100644 --- a/inst/extdata/OSD/C/CRAGOLA.json +++ b/inst/extdata/OSD/C/CRAGOLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CRAIGSVILLE.json b/inst/extdata/OSD/C/CRAIGSVILLE.json index df24ad7209..b16f0c4a83 100644 --- a/inst/extdata/OSD/C/CRAIGSVILLE.json +++ b/inst/extdata/OSD/C/CRAIGSVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CRANDON_BEACH.json b/inst/extdata/OSD/C/CRANDON_BEACH.json index a2fa66f5ef..3807ccaf8f 100644 --- a/inst/extdata/OSD/C/CRANDON_BEACH.json +++ b/inst/extdata/OSD/C/CRANDON_BEACH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/C/CRANFILL.json b/inst/extdata/OSD/C/CRANFILL.json index d33c6fc5bd..b6a60490e7 100644 --- a/inst/extdata/OSD/C/CRANFILL.json +++ b/inst/extdata/OSD/C/CRANFILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CRANMORE.json b/inst/extdata/OSD/C/CRANMORE.json index 80eabd517a..16d9c9d7ef 100644 --- a/inst/extdata/OSD/C/CRANMORE.json +++ b/inst/extdata/OSD/C/CRANMORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/C/CREEDMOOR.json b/inst/extdata/OSD/C/CREEDMOOR.json index 5d0147cc66..c8e4cbccc6 100644 --- a/inst/extdata/OSD/C/CREEDMOOR.json +++ b/inst/extdata/OSD/C/CREEDMOOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/C/CREIGHTON.json b/inst/extdata/OSD/C/CREIGHTON.json index 171522bd71..f53815c34a 100644 --- a/inst/extdata/OSD/C/CREIGHTON.json +++ b/inst/extdata/OSD/C/CREIGHTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CRESBARD.json b/inst/extdata/OSD/C/CRESBARD.json index fc8bb98902..db6310ff14 100644 --- a/inst/extdata/OSD/C/CRESBARD.json +++ b/inst/extdata/OSD/C/CRESBARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CRESTMAN.json b/inst/extdata/OSD/C/CRESTMAN.json index b240b45979..aef7c4d9cb 100644 --- a/inst/extdata/OSD/C/CRESTMAN.json +++ b/inst/extdata/OSD/C/CRESTMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CRITCHELL.json b/inst/extdata/OSD/C/CRITCHELL.json index 3aeefe319c..b388ede4f4 100644 --- a/inst/extdata/OSD/C/CRITCHELL.json +++ b/inst/extdata/OSD/C/CRITCHELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CROPLEY.json b/inst/extdata/OSD/C/CROPLEY.json index 4081f77ec3..b88c640ed7 100644 --- a/inst/extdata/OSD/C/CROPLEY.json +++ b/inst/extdata/OSD/C/CROPLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/C/CROSS.json b/inst/extdata/OSD/C/CROSS.json index 7f0451bba0..37b6344afa 100644 --- a/inst/extdata/OSD/C/CROSS.json +++ b/inst/extdata/OSD/C/CROSS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CROSSPLAIN.json b/inst/extdata/OSD/C/CROSSPLAIN.json index 8d6cd3900e..80b4f95b2f 100644 --- a/inst/extdata/OSD/C/CROSSPLAIN.json +++ b/inst/extdata/OSD/C/CROSSPLAIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CROWFLATS.json b/inst/extdata/OSD/C/CROWFLATS.json index a10afdccb1..28335f949d 100644 --- a/inst/extdata/OSD/C/CROWFLATS.json +++ b/inst/extdata/OSD/C/CROWFLATS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CROWHEART.json b/inst/extdata/OSD/C/CROWHEART.json index 9e16224a32..b7f9bb64f8 100644 --- a/inst/extdata/OSD/C/CROWHEART.json +++ b/inst/extdata/OSD/C/CROWHEART.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/C/CROWTHER.json b/inst/extdata/OSD/C/CROWTHER.json index 5dc80e5380..aff437672a 100644 --- a/inst/extdata/OSD/C/CROWTHER.json +++ b/inst/extdata/OSD/C/CROWTHER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CROW_HILL.json b/inst/extdata/OSD/C/CROW_HILL.json index b45bd33179..e26354b77a 100644 --- a/inst/extdata/OSD/C/CROW_HILL.json +++ b/inst/extdata/OSD/C/CROW_HILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CRUSO.json b/inst/extdata/OSD/C/CRUSO.json index 79303a978a..46ca0731d8 100644 --- a/inst/extdata/OSD/C/CRUSO.json +++ b/inst/extdata/OSD/C/CRUSO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CRYSTALBUTTE.json b/inst/extdata/OSD/C/CRYSTALBUTTE.json index e32a97feba..5984363a5f 100644 --- a/inst/extdata/OSD/C/CRYSTALBUTTE.json +++ b/inst/extdata/OSD/C/CRYSTALBUTTE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/C/CUESTA.json b/inst/extdata/OSD/C/CUESTA.json index 473758c797..d17a2eef46 100644 --- a/inst/extdata/OSD/C/CUESTA.json +++ b/inst/extdata/OSD/C/CUESTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CUEVA.json b/inst/extdata/OSD/C/CUEVA.json index ee17d83bc8..cd1642d6ff 100644 --- a/inst/extdata/OSD/C/CUEVA.json +++ b/inst/extdata/OSD/C/CUEVA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CUEVOLAND.json b/inst/extdata/OSD/C/CUEVOLAND.json index f99c5926c6..26ced740fd 100644 --- a/inst/extdata/OSD/C/CUEVOLAND.json +++ b/inst/extdata/OSD/C/CUEVOLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CULBERTSON.json b/inst/extdata/OSD/C/CULBERTSON.json index f1b8053cc4..e7a0405855 100644 --- a/inst/extdata/OSD/C/CULBERTSON.json +++ b/inst/extdata/OSD/C/CULBERTSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CULLISON.json b/inst/extdata/OSD/C/CULLISON.json index 6239f05cc2..4a25274d99 100644 --- a/inst/extdata/OSD/C/CULLISON.json +++ b/inst/extdata/OSD/C/CULLISON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CUMINVAR.json b/inst/extdata/OSD/C/CUMINVAR.json index 825c49ee66..76e65d9e35 100644 --- a/inst/extdata/OSD/C/CUMINVAR.json +++ b/inst/extdata/OSD/C/CUMINVAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CUMMINGS.json b/inst/extdata/OSD/C/CUMMINGS.json index ffaa1f771b..dff83d2300 100644 --- a/inst/extdata/OSD/C/CUMMINGS.json +++ b/inst/extdata/OSD/C/CUMMINGS.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/C/CUNDIYO.json b/inst/extdata/OSD/C/CUNDIYO.json index bd3cb059d8..42e951dc67 100644 --- a/inst/extdata/OSD/C/CUNDIYO.json +++ b/inst/extdata/OSD/C/CUNDIYO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CUPOLA.json b/inst/extdata/OSD/C/CUPOLA.json index ca9eb39978..a407fca2ae 100644 --- a/inst/extdata/OSD/C/CUPOLA.json +++ b/inst/extdata/OSD/C/CUPOLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CURANT.json b/inst/extdata/OSD/C/CURANT.json index 0f33786919..c6a2e824d7 100644 --- a/inst/extdata/OSD/C/CURANT.json +++ b/inst/extdata/OSD/C/CURANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/C/CUSTCO.json b/inst/extdata/OSD/C/CUSTCO.json index 33c164c282..6f2d624778 100644 --- a/inst/extdata/OSD/C/CUSTCO.json +++ b/inst/extdata/OSD/C/CUSTCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/C/CYFAIR.json b/inst/extdata/OSD/C/CYFAIR.json index c8d0da4e1a..b34b12d547 100644 --- a/inst/extdata/OSD/C/CYFAIR.json +++ b/inst/extdata/OSD/C/CYFAIR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/C/CYNTHIANA.json b/inst/extdata/OSD/C/CYNTHIANA.json index 0f4708fcc0..3827ac604f 100644 --- a/inst/extdata/OSD/C/CYNTHIANA.json +++ b/inst/extdata/OSD/C/CYNTHIANA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/C/CYPRESS_LAKE.json b/inst/extdata/OSD/C/CYPRESS_LAKE.json index 2d455ee41a..ad7e20d837 100644 --- a/inst/extdata/OSD/C/CYPRESS_LAKE.json +++ b/inst/extdata/OSD/C/CYPRESS_LAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DACONO.json b/inst/extdata/OSD/D/DACONO.json index f3433a3280..4653032270 100644 --- a/inst/extdata/OSD/D/DACONO.json +++ b/inst/extdata/OSD/D/DACONO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DACOSTA.json b/inst/extdata/OSD/D/DACOSTA.json index 49c0972680..6ed41aeb90 100644 --- a/inst/extdata/OSD/D/DACOSTA.json +++ b/inst/extdata/OSD/D/DACOSTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/D/DADINA.json b/inst/extdata/OSD/D/DADINA.json index 54b93d7bc6..b973a5ce0a 100644 --- a/inst/extdata/OSD/D/DADINA.json +++ b/inst/extdata/OSD/D/DADINA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DAGGERHILL.json b/inst/extdata/OSD/D/DAGGERHILL.json index 6f8c7256cd..05d8967240 100644 --- a/inst/extdata/OSD/D/DAGGERHILL.json +++ b/inst/extdata/OSD/D/DAGGERHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "excessively", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/D/DAGLUM.json b/inst/extdata/OSD/D/DAGLUM.json index 87f5813e7b..e055cdddd3 100644 --- a/inst/extdata/OSD/D/DAGLUM.json +++ b/inst/extdata/OSD/D/DAGLUM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DAILEY.json b/inst/extdata/OSD/D/DAILEY.json index a46f412dab..5a1ad2db67 100644 --- a/inst/extdata/OSD/D/DAILEY.json +++ b/inst/extdata/OSD/D/DAILEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/D/DAIR.json b/inst/extdata/OSD/D/DAIR.json index c009af5149..193243b17e 100644 --- a/inst/extdata/OSD/D/DAIR.json +++ b/inst/extdata/OSD/D/DAIR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DALBO.json b/inst/extdata/OSD/D/DALBO.json index ba8d82d5c9..63d57cd6eb 100644 --- a/inst/extdata/OSD/D/DALBO.json +++ b/inst/extdata/OSD/D/DALBO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DALIAN.json b/inst/extdata/OSD/D/DALIAN.json index ed9ccd7196..322b9d3c98 100644 --- a/inst/extdata/OSD/D/DALIAN.json +++ b/inst/extdata/OSD/D/DALIAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DANACOVE.json b/inst/extdata/OSD/D/DANACOVE.json index be40f82480..cf58d4355e 100644 --- a/inst/extdata/OSD/D/DANACOVE.json +++ b/inst/extdata/OSD/D/DANACOVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/D/DANDREA.json b/inst/extdata/OSD/D/DANDREA.json index aea16d8abc..e89febd52b 100644 --- a/inst/extdata/OSD/D/DANDREA.json +++ b/inst/extdata/OSD/D/DANDREA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DANIELSON.json b/inst/extdata/OSD/D/DANIELSON.json index c0be306958..43013a1a3f 100644 --- a/inst/extdata/OSD/D/DANIELSON.json +++ b/inst/extdata/OSD/D/DANIELSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/D/DANKO.json b/inst/extdata/OSD/D/DANKO.json index 86ac5fb433..99024e361b 100644 --- a/inst/extdata/OSD/D/DANKO.json +++ b/inst/extdata/OSD/D/DANKO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DANSKIN.json b/inst/extdata/OSD/D/DANSKIN.json index 9d5f38c1fb..8196768b52 100644 --- a/inst/extdata/OSD/D/DANSKIN.json +++ b/inst/extdata/OSD/D/DANSKIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DARKWOODS.json b/inst/extdata/OSD/D/DARKWOODS.json index 871ff44d5a..a523c423ea 100644 --- a/inst/extdata/OSD/D/DARKWOODS.json +++ b/inst/extdata/OSD/D/DARKWOODS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DARNELL.json b/inst/extdata/OSD/D/DARNELL.json index 84f8c8dc4e..747c8188d0 100644 --- a/inst/extdata/OSD/D/DARNELL.json +++ b/inst/extdata/OSD/D/DARNELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DARRET.json b/inst/extdata/OSD/D/DARRET.json index d86ef03988..a3e5bfdc7d 100644 --- a/inst/extdata/OSD/D/DARRET.json +++ b/inst/extdata/OSD/D/DARRET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DARWIN.json b/inst/extdata/OSD/D/DARWIN.json index fdaff6f84d..d11ec15d2a 100644 --- a/inst/extdata/OSD/D/DARWIN.json +++ b/inst/extdata/OSD/D/DARWIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DAST.json b/inst/extdata/OSD/D/DAST.json index c0a891ac22..06ad133180 100644 --- a/inst/extdata/OSD/D/DAST.json +++ b/inst/extdata/OSD/D/DAST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DAULTON.json b/inst/extdata/OSD/D/DAULTON.json index 7e99bc496f..f03ae1d447 100644 --- a/inst/extdata/OSD/D/DAULTON.json +++ b/inst/extdata/OSD/D/DAULTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DAVILLA.json b/inst/extdata/OSD/D/DAVILLA.json index 093b709ba8..5440decbd5 100644 --- a/inst/extdata/OSD/D/DAVILLA.json +++ b/inst/extdata/OSD/D/DAVILLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/D/DAVIS.json b/inst/extdata/OSD/D/DAVIS.json index 7930c3d349..633a16c9ac 100644 --- a/inst/extdata/OSD/D/DAVIS.json +++ b/inst/extdata/OSD/D/DAVIS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DEACON.json b/inst/extdata/OSD/D/DEACON.json index a2d4960d8e..bba86bef59 100644 --- a/inst/extdata/OSD/D/DEACON.json +++ b/inst/extdata/OSD/D/DEACON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DEADMAN.json b/inst/extdata/OSD/D/DEADMAN.json index 462e394c32..c3eea92761 100644 --- a/inst/extdata/OSD/D/DEADMAN.json +++ b/inst/extdata/OSD/D/DEADMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DEARDORF.json b/inst/extdata/OSD/D/DEARDORF.json index 312b8d445a..b72fe4a6a8 100644 --- a/inst/extdata/OSD/D/DEARDORF.json +++ b/inst/extdata/OSD/D/DEARDORF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DEBONE.json b/inst/extdata/OSD/D/DEBONE.json index 6d904ca0ac..cf2f7b52ea 100644 --- a/inst/extdata/OSD/D/DEBONE.json +++ b/inst/extdata/OSD/D/DEBONE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well or well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DECK.json b/inst/extdata/OSD/D/DECK.json index 580c3468da..4a0693204e 100644 --- a/inst/extdata/OSD/D/DECK.json +++ b/inst/extdata/OSD/D/DECK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DEERHEART.json b/inst/extdata/OSD/D/DEERHEART.json index d130935ded..3ae0eacbe5 100644 --- a/inst/extdata/OSD/D/DEERHEART.json +++ b/inst/extdata/OSD/D/DEERHEART.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DEER_CREEK.json b/inst/extdata/OSD/D/DEER_CREEK.json index b39e93f4d2..4d62ed2c1c 100644 --- a/inst/extdata/OSD/D/DEER_CREEK.json +++ b/inst/extdata/OSD/D/DEER_CREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DEFORD.json b/inst/extdata/OSD/D/DEFORD.json index 9b1924a460..1d22e07b30 100644 --- a/inst/extdata/OSD/D/DEFORD.json +++ b/inst/extdata/OSD/D/DEFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DEGARMO.json b/inst/extdata/OSD/D/DEGARMO.json index 73d8afa148..a3bf313e2e 100644 --- a/inst/extdata/OSD/D/DEGARMO.json +++ b/inst/extdata/OSD/D/DEGARMO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/D/DEGNER.json b/inst/extdata/OSD/D/DEGNER.json index 32e5ff89e9..fec5fecc72 100644 --- a/inst/extdata/OSD/D/DEGNER.json +++ b/inst/extdata/OSD/D/DEGNER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DEKALB.json b/inst/extdata/OSD/D/DEKALB.json index e04cfef884..1b084e5e09 100644 --- a/inst/extdata/OSD/D/DEKALB.json +++ b/inst/extdata/OSD/D/DEKALB.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/D/DELANCO.json b/inst/extdata/OSD/D/DELANCO.json index a4a5907457..3c46fa7d7c 100644 --- a/inst/extdata/OSD/D/DELANCO.json +++ b/inst/extdata/OSD/D/DELANCO.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DELETE_MEII.json b/inst/extdata/OSD/D/DELETE_MEII.json index 502c97f67b..2d75638972 100644 --- a/inst/extdata/OSD/D/DELETE_MEII.json +++ b/inst/extdata/OSD/D/DELETE_MEII.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DELFT.json b/inst/extdata/OSD/D/DELFT.json index 4efa5245e0..cadc014e61 100644 --- a/inst/extdata/OSD/D/DELFT.json +++ b/inst/extdata/OSD/D/DELFT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/D/DELL.json b/inst/extdata/OSD/D/DELL.json index 7820287dfd..0fa4565c12 100644 --- a/inst/extdata/OSD/D/DELL.json +++ b/inst/extdata/OSD/D/DELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DELLEKER.json b/inst/extdata/OSD/D/DELLEKER.json index 6ca921e01d..b765b95f30 100644 --- a/inst/extdata/OSD/D/DELLEKER.json +++ b/inst/extdata/OSD/D/DELLEKER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DELMA.json b/inst/extdata/OSD/D/DELMA.json index 4abb222ec6..760e8e4a48 100644 --- a/inst/extdata/OSD/D/DELMA.json +++ b/inst/extdata/OSD/D/DELMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DELMITA.json b/inst/extdata/OSD/D/DELMITA.json index 299dc257b4..285f65e8a8 100644 --- a/inst/extdata/OSD/D/DELMITA.json +++ b/inst/extdata/OSD/D/DELMITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DELNORTE.json b/inst/extdata/OSD/D/DELNORTE.json index 097421693b..fcf1df469d 100644 --- a/inst/extdata/OSD/D/DELNORTE.json +++ b/inst/extdata/OSD/D/DELNORTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DELPIEDRA.json b/inst/extdata/OSD/D/DELPIEDRA.json index 75c99e98eb..e79c03e0f1 100644 --- a/inst/extdata/OSD/D/DELPIEDRA.json +++ b/inst/extdata/OSD/D/DELPIEDRA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DELTASHORE.json b/inst/extdata/OSD/D/DELTASHORE.json index 9b57f0b759..7abe45255f 100644 --- a/inst/extdata/OSD/D/DELTASHORE.json +++ b/inst/extdata/OSD/D/DELTASHORE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DEMAS.json b/inst/extdata/OSD/D/DEMAS.json index 64f33c603b..cdfa549b78 100644 --- a/inst/extdata/OSD/D/DEMAS.json +++ b/inst/extdata/OSD/D/DEMAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/D/DEMONA.json b/inst/extdata/OSD/D/DEMONA.json index 0474b39baf..9d35a7af29 100644 --- a/inst/extdata/OSD/D/DEMONA.json +++ b/inst/extdata/OSD/D/DEMONA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/D/DEMONTREVILLE.json b/inst/extdata/OSD/D/DEMONTREVILLE.json index afb564363d..025a3a6c23 100644 --- a/inst/extdata/OSD/D/DEMONTREVILLE.json +++ b/inst/extdata/OSD/D/DEMONTREVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DENMARK.json b/inst/extdata/OSD/D/DENMARK.json index adcae47782..15c5ebc2cd 100644 --- a/inst/extdata/OSD/D/DENMARK.json +++ b/inst/extdata/OSD/D/DENMARK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DENURE.json b/inst/extdata/OSD/D/DENURE.json index fba73e68f6..aa041d219b 100644 --- a/inst/extdata/OSD/D/DENURE.json +++ b/inst/extdata/OSD/D/DENURE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DENVER.json b/inst/extdata/OSD/D/DENVER.json index f598aee605..325af494fc 100644 --- a/inst/extdata/OSD/D/DENVER.json +++ b/inst/extdata/OSD/D/DENVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DEROIN.json b/inst/extdata/OSD/D/DEROIN.json index 3e816850e2..d217e5ef4e 100644 --- a/inst/extdata/OSD/D/DEROIN.json +++ b/inst/extdata/OSD/D/DEROIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DERRICK.json b/inst/extdata/OSD/D/DERRICK.json index af5d87c025..dbb466a17c 100644 --- a/inst/extdata/OSD/D/DERRICK.json +++ b/inst/extdata/OSD/D/DERRICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DERRYNANE.json b/inst/extdata/OSD/D/DERRYNANE.json index c0689b365e..bbf850e04f 100644 --- a/inst/extdata/OSD/D/DERRYNANE.json +++ b/inst/extdata/OSD/D/DERRYNANE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/D/DESHLER.json b/inst/extdata/OSD/D/DESHLER.json index 555d7f26ae..8c6085528f 100644 --- a/inst/extdata/OSD/D/DESHLER.json +++ b/inst/extdata/OSD/D/DESHLER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DES_MOINES.json b/inst/extdata/OSD/D/DES_MOINES.json index a23f57f6df..909798d3a5 100644 --- a/inst/extdata/OSD/D/DES_MOINES.json +++ b/inst/extdata/OSD/D/DES_MOINES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DETROIT.json b/inst/extdata/OSD/D/DETROIT.json index e92c59f2f9..baa904422a 100644 --- a/inst/extdata/OSD/D/DETROIT.json +++ b/inst/extdata/OSD/D/DETROIT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/D/DIAMOND_SPRINGS.json b/inst/extdata/OSD/D/DIAMOND_SPRINGS.json index e74c854188..e5770dd726 100644 --- a/inst/extdata/OSD/D/DIAMOND_SPRINGS.json +++ b/inst/extdata/OSD/D/DIAMOND_SPRINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DIMYAW.json b/inst/extdata/OSD/D/DIMYAW.json index 219a0fa7e9..6be027575b 100644 --- a/inst/extdata/OSD/D/DIMYAW.json +++ b/inst/extdata/OSD/D/DIMYAW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DINKELMAN.json b/inst/extdata/OSD/D/DINKELMAN.json index aa7e921e0e..01565a618c 100644 --- a/inst/extdata/OSD/D/DINKELMAN.json +++ b/inst/extdata/OSD/D/DINKELMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DIPMAN.json b/inst/extdata/OSD/D/DIPMAN.json index 134fe13ab0..9f286c88cd 100644 --- a/inst/extdata/OSD/D/DIPMAN.json +++ b/inst/extdata/OSD/D/DIPMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/D/DISMALSWAMP.json b/inst/extdata/OSD/D/DISMALSWAMP.json index f5d257b2d8..0b029ced80 100644 --- a/inst/extdata/OSD/D/DISMALSWAMP.json +++ b/inst/extdata/OSD/D/DISMALSWAMP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DITCHCAMP.json b/inst/extdata/OSD/D/DITCHCAMP.json index 941cad05c3..37d28aae6e 100644 --- a/inst/extdata/OSD/D/DITCHCAMP.json +++ b/inst/extdata/OSD/D/DITCHCAMP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DIXMONT.json b/inst/extdata/OSD/D/DIXMONT.json index 5ec3b784b6..80ca91a09b 100644 --- a/inst/extdata/OSD/D/DIXMONT.json +++ b/inst/extdata/OSD/D/DIXMONT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DOBROW.json b/inst/extdata/OSD/D/DOBROW.json index 8d26422824..12f9fded09 100644 --- a/inst/extdata/OSD/D/DOBROW.json +++ b/inst/extdata/OSD/D/DOBROW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly to very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DOCAS.json b/inst/extdata/OSD/D/DOCAS.json index 9dfb4a8632..6d6626c104 100644 --- a/inst/extdata/OSD/D/DOCAS.json +++ b/inst/extdata/OSD/D/DOCAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DODGE.json b/inst/extdata/OSD/D/DODGE.json index 566ef82b62..433a0ce2f2 100644 --- a/inst/extdata/OSD/D/DODGE.json +++ b/inst/extdata/OSD/D/DODGE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DOGER.json b/inst/extdata/OSD/D/DOGER.json index 9824e89547..29a070f98f 100644 --- a/inst/extdata/OSD/D/DOGER.json +++ b/inst/extdata/OSD/D/DOGER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DOLEKEI.json b/inst/extdata/OSD/D/DOLEKEI.json index 3fd32a3f7b..491e55cb7a 100644 --- a/inst/extdata/OSD/D/DOLEKEI.json +++ b/inst/extdata/OSD/D/DOLEKEI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DOMO.json b/inst/extdata/OSD/D/DOMO.json index 397d5e8400..d297f90bf7 100644 --- a/inst/extdata/OSD/D/DOMO.json +++ b/inst/extdata/OSD/D/DOMO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DONLONTON.json b/inst/extdata/OSD/D/DONLONTON.json index e77cf3c1f9..bff7250632 100644 --- a/inst/extdata/OSD/D/DONLONTON.json +++ b/inst/extdata/OSD/D/DONLONTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DORCHEAT.json b/inst/extdata/OSD/D/DORCHEAT.json index a2914e5f2d..ed32177e4a 100644 --- a/inst/extdata/OSD/D/DORCHEAT.json +++ b/inst/extdata/OSD/D/DORCHEAT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/D/DORCHESTER.json b/inst/extdata/OSD/D/DORCHESTER.json index a564502c63..66224ce7f0 100644 --- a/inst/extdata/OSD/D/DORCHESTER.json +++ b/inst/extdata/OSD/D/DORCHESTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DORS.json b/inst/extdata/OSD/D/DORS.json index 3aed7eb3ef..9966bedc32 100644 --- a/inst/extdata/OSD/D/DORS.json +++ b/inst/extdata/OSD/D/DORS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DOUGHSPON.json b/inst/extdata/OSD/D/DOUGHSPON.json index c8d3bd6674..571ea2cc6d 100644 --- a/inst/extdata/OSD/D/DOUGHSPON.json +++ b/inst/extdata/OSD/D/DOUGHSPON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well or well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DOVRAY.json b/inst/extdata/OSD/D/DOVRAY.json index 514b2637ea..acb24d6052 100644 --- a/inst/extdata/OSD/D/DOVRAY.json +++ b/inst/extdata/OSD/D/DOVRAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DOWNATA.json b/inst/extdata/OSD/D/DOWNATA.json index 71955b9be6..327405e2cf 100644 --- a/inst/extdata/OSD/D/DOWNATA.json +++ b/inst/extdata/OSD/D/DOWNATA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DRA.json b/inst/extdata/OSD/D/DRA.json index c0d1da60d6..42ee8819ca 100644 --- a/inst/extdata/OSD/D/DRA.json +++ b/inst/extdata/OSD/D/DRA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DRAGLINE.json b/inst/extdata/OSD/D/DRAGLINE.json index 9db894c0a8..6aaf457eb9 100644 --- a/inst/extdata/OSD/D/DRAGLINE.json +++ b/inst/extdata/OSD/D/DRAGLINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DRAKNAB.json b/inst/extdata/OSD/D/DRAKNAB.json index 8832cf9fcb..94890f2f0f 100644 --- a/inst/extdata/OSD/D/DRAKNAB.json +++ b/inst/extdata/OSD/D/DRAKNAB.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or excessively", - "drainage_overview": "well or excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DRAYKE.json b/inst/extdata/OSD/D/DRAYKE.json index 7f91729f9b..25d07e0b6c 100644 --- a/inst/extdata/OSD/D/DRAYKE.json +++ b/inst/extdata/OSD/D/DRAYKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DREXEL.json b/inst/extdata/OSD/D/DREXEL.json index 631268345b..871113edb8 100644 --- a/inst/extdata/OSD/D/DREXEL.json +++ b/inst/extdata/OSD/D/DREXEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DREYFOOS.json b/inst/extdata/OSD/D/DREYFOOS.json index 2a56a2355f..d6c1c846af 100644 --- a/inst/extdata/OSD/D/DREYFOOS.json +++ b/inst/extdata/OSD/D/DREYFOOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "excessively", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/D/DRYBURG.json b/inst/extdata/OSD/D/DRYBURG.json index 9780309232..7abaf9c2a8 100644 --- a/inst/extdata/OSD/D/DRYBURG.json +++ b/inst/extdata/OSD/D/DRYBURG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DRY_CREEK.json b/inst/extdata/OSD/D/DRY_CREEK.json index 047d20fa80..2a5bcb631c 100644 --- a/inst/extdata/OSD/D/DRY_CREEK.json +++ b/inst/extdata/OSD/D/DRY_CREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUCKHILL.json b/inst/extdata/OSD/D/DUCKHILL.json index 934dfa3b88..5316e46107 100644 --- a/inst/extdata/OSD/D/DUCKHILL.json +++ b/inst/extdata/OSD/D/DUCKHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUDLEY.json b/inst/extdata/OSD/D/DUDLEY.json index 755c04c9c8..f6e6d57ff3 100644 --- a/inst/extdata/OSD/D/DUDLEY.json +++ b/inst/extdata/OSD/D/DUDLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DUFFAU.json b/inst/extdata/OSD/D/DUFFAU.json index 30ebd13986..8907d8d7b0 100644 --- a/inst/extdata/OSD/D/DUFFAU.json +++ b/inst/extdata/OSD/D/DUFFAU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUFFER.json b/inst/extdata/OSD/D/DUFFER.json index b129370474..8b72ea0e06 100644 --- a/inst/extdata/OSD/D/DUFFER.json +++ b/inst/extdata/OSD/D/DUFFER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/D/DUFFYMONT.json b/inst/extdata/OSD/D/DUFFYMONT.json index 672cd95ae5..f297be857a 100644 --- a/inst/extdata/OSD/D/DUFFYMONT.json +++ b/inst/extdata/OSD/D/DUFFYMONT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DUFORT.json b/inst/extdata/OSD/D/DUFORT.json index 2f4ad40f17..3513c67978 100644 --- a/inst/extdata/OSD/D/DUFORT.json +++ b/inst/extdata/OSD/D/DUFORT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUFUR.json b/inst/extdata/OSD/D/DUFUR.json index a2ba91f78e..017826708c 100644 --- a/inst/extdata/OSD/D/DUFUR.json +++ b/inst/extdata/OSD/D/DUFUR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/D/DUKE.json b/inst/extdata/OSD/D/DUKE.json index 391b74ddd8..8c18cccb49 100644 --- a/inst/extdata/OSD/D/DUKE.json +++ b/inst/extdata/OSD/D/DUKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DULLES.json b/inst/extdata/OSD/D/DULLES.json index e9a404a41b..7bc234609c 100644 --- a/inst/extdata/OSD/D/DULLES.json +++ b/inst/extdata/OSD/D/DULLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DUNCAN.json b/inst/extdata/OSD/D/DUNCAN.json index 89c9d1c0bd..e8d143488a 100644 --- a/inst/extdata/OSD/D/DUNCAN.json +++ b/inst/extdata/OSD/D/DUNCAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/D/DUNNING.json b/inst/extdata/OSD/D/DUNNING.json index 7c00857f26..10bd44395b 100644 --- a/inst/extdata/OSD/D/DUNNING.json +++ b/inst/extdata/OSD/D/DUNNING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/D/DUNUL.json b/inst/extdata/OSD/D/DUNUL.json index 9a4c499cb1..41e08cb445 100644 --- a/inst/extdata/OSD/D/DUNUL.json +++ b/inst/extdata/OSD/D/DUNUL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/D/DUPEE.json b/inst/extdata/OSD/D/DUPEE.json index e601b50f31..d4ede51852 100644 --- a/inst/extdata/OSD/D/DUPEE.json +++ b/inst/extdata/OSD/D/DUPEE.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/D/DUROC.json b/inst/extdata/OSD/D/DUROC.json index 2ae5b2c437..7afc0a7513 100644 --- a/inst/extdata/OSD/D/DUROC.json +++ b/inst/extdata/OSD/D/DUROC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DURREO.json b/inst/extdata/OSD/D/DURREO.json index fc93a9fe84..aa06cb22a8 100644 --- a/inst/extdata/OSD/D/DURREO.json +++ b/inst/extdata/OSD/D/DURREO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUTCHMAN_POINT.json b/inst/extdata/OSD/D/DUTCHMAN_POINT.json index 4db10872d9..8400776de8 100644 --- a/inst/extdata/OSD/D/DUTCHMAN_POINT.json +++ b/inst/extdata/OSD/D/DUTCHMAN_POINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/D/DUTTON.json b/inst/extdata/OSD/D/DUTTON.json index 80eb58a229..ef43fe57aa 100644 --- a/inst/extdata/OSD/D/DUTTON.json +++ b/inst/extdata/OSD/D/DUTTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/D/DUVALL_CREEK.json b/inst/extdata/OSD/D/DUVALL_CREEK.json index 346b9cce73..bb2d1fb186 100644 --- a/inst/extdata/OSD/D/DUVALL_CREEK.json +++ b/inst/extdata/OSD/D/DUVALL_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/D/DU_PAGE.json b/inst/extdata/OSD/D/DU_PAGE.json index ffe52627ce..0e3cdccc4a 100644 --- a/inst/extdata/OSD/D/DU_PAGE.json +++ b/inst/extdata/OSD/D/DU_PAGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/D/DWIGHT.json b/inst/extdata/OSD/D/DWIGHT.json index 62afdf0b83..3f22da7945 100644 --- a/inst/extdata/OSD/D/DWIGHT.json +++ b/inst/extdata/OSD/D/DWIGHT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/D/DYKE.json b/inst/extdata/OSD/D/DYKE.json index fa22bc2696..46189fc34a 100644 --- a/inst/extdata/OSD/D/DYKE.json +++ b/inst/extdata/OSD/D/DYKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EAD.json b/inst/extdata/OSD/E/EAD.json index 8d07ebf75a..78c1fd0484 100644 --- a/inst/extdata/OSD/E/EAD.json +++ b/inst/extdata/OSD/E/EAD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EAGAR.json b/inst/extdata/OSD/E/EAGAR.json index 9c9bd4485f..da7d36360e 100644 --- a/inst/extdata/OSD/E/EAGAR.json +++ b/inst/extdata/OSD/E/EAGAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EARP.json b/inst/extdata/OSD/E/EARP.json index d8e1a27524..38f95c011f 100644 --- a/inst/extdata/OSD/E/EARP.json +++ b/inst/extdata/OSD/E/EARP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EARSMAN.json b/inst/extdata/OSD/E/EARSMAN.json index b8c1428246..429ee8d35f 100644 --- a/inst/extdata/OSD/E/EARSMAN.json +++ b/inst/extdata/OSD/E/EARSMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/EATON.json b/inst/extdata/OSD/E/EATON.json index a47f8ad4bb..42ea649692 100644 --- a/inst/extdata/OSD/E/EATON.json +++ b/inst/extdata/OSD/E/EATON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EAUGALLIE.json b/inst/extdata/OSD/E/EAUGALLIE.json index 657b9a0b15..d38ab93ce5 100644 --- a/inst/extdata/OSD/E/EAUGALLIE.json +++ b/inst/extdata/OSD/E/EAUGALLIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EBA.json b/inst/extdata/OSD/E/EBA.json index 5d80b01192..bd61e118fd 100644 --- a/inst/extdata/OSD/E/EBA.json +++ b/inst/extdata/OSD/E/EBA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EBBERT.json b/inst/extdata/OSD/E/EBBERT.json index 18e89c38c5..e0236d3e14 100644 --- a/inst/extdata/OSD/E/EBBERT.json +++ b/inst/extdata/OSD/E/EBBERT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ECKRANT.json b/inst/extdata/OSD/E/ECKRANT.json index 63595f24bb..93158d7e63 100644 --- a/inst/extdata/OSD/E/ECKRANT.json +++ b/inst/extdata/OSD/E/ECKRANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EDA.json b/inst/extdata/OSD/E/EDA.json index 1461579403..9e2c74ba0e 100644 --- a/inst/extdata/OSD/E/EDA.json +++ b/inst/extdata/OSD/E/EDA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/E/EDALGO.json b/inst/extdata/OSD/E/EDALGO.json index 68a33253a4..259c15dbdf 100644 --- a/inst/extdata/OSD/E/EDALGO.json +++ b/inst/extdata/OSD/E/EDALGO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EDDY.json b/inst/extdata/OSD/E/EDDY.json index 33d62d8e75..862ae69bd6 100644 --- a/inst/extdata/OSD/E/EDDY.json +++ b/inst/extdata/OSD/E/EDDY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EDGAR.json b/inst/extdata/OSD/E/EDGAR.json index 4f82e52d3c..d180523eee 100644 --- a/inst/extdata/OSD/E/EDGAR.json +++ b/inst/extdata/OSD/E/EDGAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/EDGEMERE.json b/inst/extdata/OSD/E/EDGEMERE.json index 0478c495e4..7c36e99e51 100644 --- a/inst/extdata/OSD/E/EDGEMERE.json +++ b/inst/extdata/OSD/E/EDGEMERE.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "very poorly and poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EDGEWATER.json b/inst/extdata/OSD/E/EDGEWATER.json index a145313418..c12fea4f81 100644 --- a/inst/extdata/OSD/E/EDGEWATER.json +++ b/inst/extdata/OSD/E/EDGEWATER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/E/EDGEWOOD.json b/inst/extdata/OSD/E/EDGEWOOD.json index d26abe9f39..300f1c0c8a 100644 --- a/inst/extdata/OSD/E/EDGEWOOD.json +++ b/inst/extdata/OSD/E/EDGEWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/E/EDMORE.json b/inst/extdata/OSD/E/EDMORE.json index eb63dce336..50081c580a 100644 --- a/inst/extdata/OSD/E/EDMORE.json +++ b/inst/extdata/OSD/E/EDMORE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EGAM.json b/inst/extdata/OSD/E/EGAM.json index 0f3b88f314..223af471c4 100644 --- a/inst/extdata/OSD/E/EGAM.json +++ b/inst/extdata/OSD/E/EGAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/EGAS.json b/inst/extdata/OSD/E/EGAS.json index 2ecce39249..9de58095ac 100644 --- a/inst/extdata/OSD/E/EGAS.json +++ b/inst/extdata/OSD/E/EGAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EGGLAKE.json b/inst/extdata/OSD/E/EGGLAKE.json index b60af6f9bd..dc45a6ec77 100644 --- a/inst/extdata/OSD/E/EGGLAKE.json +++ b/inst/extdata/OSD/E/EGGLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EGHELM.json b/inst/extdata/OSD/E/EGHELM.json index e87dacd4a4..354cabc5b4 100644 --- a/inst/extdata/OSD/E/EGHELM.json +++ b/inst/extdata/OSD/E/EGHELM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/EIELSON.json b/inst/extdata/OSD/E/EIELSON.json index 5cc1e21ef1..c6204f4f3d 100644 --- a/inst/extdata/OSD/E/EIELSON.json +++ b/inst/extdata/OSD/E/EIELSON.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "" + "drainage_overview": "somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/E/EITZEN.json b/inst/extdata/OSD/E/EITZEN.json index ddc8b9bdb4..9fdd140089 100644 --- a/inst/extdata/OSD/E/EITZEN.json +++ b/inst/extdata/OSD/E/EITZEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EKAL.json b/inst/extdata/OSD/E/EKAL.json index a9fa0ee8d9..80a1622ab7 100644 --- a/inst/extdata/OSD/E/EKAL.json +++ b/inst/extdata/OSD/E/EKAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/E/EKALAKA.json b/inst/extdata/OSD/E/EKALAKA.json index 77ceccca35..16d65349f1 100644 --- a/inst/extdata/OSD/E/EKALAKA.json +++ b/inst/extdata/OSD/E/EKALAKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ELA.json b/inst/extdata/OSD/E/ELA.json index 61ccf9635c..691927ce76 100644 --- a/inst/extdata/OSD/E/ELA.json +++ b/inst/extdata/OSD/E/ELA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ELBAVILLE.json b/inst/extdata/OSD/E/ELBAVILLE.json index f82e0b6616..609f249c2f 100644 --- a/inst/extdata/OSD/E/ELBAVILLE.json +++ b/inst/extdata/OSD/E/ELBAVILLE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/E/ELDER.json b/inst/extdata/OSD/E/ELDER.json index e3e92ecb88..dcddde0741 100644 --- a/inst/extdata/OSD/E/ELDER.json +++ b/inst/extdata/OSD/E/ELDER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ELEVA.json b/inst/extdata/OSD/E/ELEVA.json index d8bd082c92..357744742f 100644 --- a/inst/extdata/OSD/E/ELEVA.json +++ b/inst/extdata/OSD/E/ELEVA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/ELKINS.json b/inst/extdata/OSD/E/ELKINS.json index c4d1aaed7a..8f902d117c 100644 --- a/inst/extdata/OSD/E/ELKINS.json +++ b/inst/extdata/OSD/E/ELKINS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ELKRIVER.json b/inst/extdata/OSD/E/ELKRIVER.json index 2f9212b349..a995766ec8 100644 --- a/inst/extdata/OSD/E/ELKRIVER.json +++ b/inst/extdata/OSD/E/ELKRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/E/ELKWALOW.json b/inst/extdata/OSD/E/ELKWALOW.json index d72e4110bb..c66f894862 100644 --- a/inst/extdata/OSD/E/ELKWALOW.json +++ b/inst/extdata/OSD/E/ELKWALOW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/E/ELLEDGE.json b/inst/extdata/OSD/E/ELLEDGE.json index 7ff97cccfd..c358e3962b 100644 --- a/inst/extdata/OSD/E/ELLEDGE.json +++ b/inst/extdata/OSD/E/ELLEDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ELLETT.json b/inst/extdata/OSD/E/ELLETT.json index b1fdfa2d01..4db3642b3c 100644 --- a/inst/extdata/OSD/E/ELLETT.json +++ b/inst/extdata/OSD/E/ELLETT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ELLISFORDE.json b/inst/extdata/OSD/E/ELLISFORDE.json index 0ffbbb2c2c..c037c8e6e8 100644 --- a/inst/extdata/OSD/E/ELLISFORDE.json +++ b/inst/extdata/OSD/E/ELLISFORDE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ELSAH.json b/inst/extdata/OSD/E/ELSAH.json index 40b64e20d4..a088415286 100644 --- a/inst/extdata/OSD/E/ELSAH.json +++ b/inst/extdata/OSD/E/ELSAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/ELTSAC.json b/inst/extdata/OSD/E/ELTSAC.json index 1bca8d6817..53907ac120 100644 --- a/inst/extdata/OSD/E/ELTSAC.json +++ b/inst/extdata/OSD/E/ELTSAC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ELVERS.json b/inst/extdata/OSD/E/ELVERS.json index 139bdfcafe..b8a77beea3 100644 --- a/inst/extdata/OSD/E/ELVERS.json +++ b/inst/extdata/OSD/E/ELVERS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EMBDEN.json b/inst/extdata/OSD/E/EMBDEN.json index b049c3b7f6..f3ad99c94f 100644 --- a/inst/extdata/OSD/E/EMBDEN.json +++ b/inst/extdata/OSD/E/EMBDEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/EMBRY.json b/inst/extdata/OSD/E/EMBRY.json index 3d251ad93c..3265137541 100644 --- a/inst/extdata/OSD/E/EMBRY.json +++ b/inst/extdata/OSD/E/EMBRY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/E/EMIGRANT.json b/inst/extdata/OSD/E/EMIGRANT.json index 1f1b6c035a..514423f309 100644 --- a/inst/extdata/OSD/E/EMIGRANT.json +++ b/inst/extdata/OSD/E/EMIGRANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EMMET.json b/inst/extdata/OSD/E/EMMET.json index 258029e2a5..fe57c9a87e 100644 --- a/inst/extdata/OSD/E/EMMET.json +++ b/inst/extdata/OSD/E/EMMET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/EMOT.json b/inst/extdata/OSD/E/EMOT.json index 2c8afe142b..512fd0dc79 100644 --- a/inst/extdata/OSD/E/EMOT.json +++ b/inst/extdata/OSD/E/EMOT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EMPIRE.json b/inst/extdata/OSD/E/EMPIRE.json index c75aaeb48b..d3812154cf 100644 --- a/inst/extdata/OSD/E/EMPIRE.json +++ b/inst/extdata/OSD/E/EMPIRE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/EMRICK.json b/inst/extdata/OSD/E/EMRICK.json index f97b7149b6..92e478ec9b 100644 --- a/inst/extdata/OSD/E/EMRICK.json +++ b/inst/extdata/OSD/E/EMRICK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ENDEAVOR.json b/inst/extdata/OSD/E/ENDEAVOR.json index dfd87cd997..010f6c6f59 100644 --- a/inst/extdata/OSD/E/ENDEAVOR.json +++ b/inst/extdata/OSD/E/ENDEAVOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/E/ENGLEWOOD.json b/inst/extdata/OSD/E/ENGLEWOOD.json index fee5e1877e..386cfc9e47 100644 --- a/inst/extdata/OSD/E/ENGLEWOOD.json +++ b/inst/extdata/OSD/E/ENGLEWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ENNING.json b/inst/extdata/OSD/E/ENNING.json index aed0e2d035..f3ea243529 100644 --- a/inst/extdata/OSD/E/ENNING.json +++ b/inst/extdata/OSD/E/ENNING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/ENNIS.json b/inst/extdata/OSD/E/ENNIS.json index 8f5c8e5652..844694234b 100644 --- a/inst/extdata/OSD/E/ENNIS.json +++ b/inst/extdata/OSD/E/ENNIS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/E/EPHRATA.json b/inst/extdata/OSD/E/EPHRATA.json index 103d93487d..b18b34c438 100644 --- a/inst/extdata/OSD/E/EPHRATA.json +++ b/inst/extdata/OSD/E/EPHRATA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EPOUFETTE.json b/inst/extdata/OSD/E/EPOUFETTE.json index 789d27e5cd..24e7f043e1 100644 --- a/inst/extdata/OSD/E/EPOUFETTE.json +++ b/inst/extdata/OSD/E/EPOUFETTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EPWORTH.json b/inst/extdata/OSD/E/EPWORTH.json index 2644c91a4f..954512b0a9 100644 --- a/inst/extdata/OSD/E/EPWORTH.json +++ b/inst/extdata/OSD/E/EPWORTH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ERA.json b/inst/extdata/OSD/E/ERA.json index 72c95b23ac..11b63a56b4 100644 --- a/inst/extdata/OSD/E/ERA.json +++ b/inst/extdata/OSD/E/ERA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ERIN.json b/inst/extdata/OSD/E/ERIN.json index 1e6a9c4c5d..8c29ab8a5a 100644 --- a/inst/extdata/OSD/E/ERIN.json +++ b/inst/extdata/OSD/E/ERIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/E/ERMATINGER.json b/inst/extdata/OSD/E/ERMATINGER.json index 5087e4b7b1..f2b5729bdb 100644 --- a/inst/extdata/OSD/E/ERMATINGER.json +++ b/inst/extdata/OSD/E/ERMATINGER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ERNEST.json b/inst/extdata/OSD/E/ERNEST.json index d722983202..3fd1e88b94 100644 --- a/inst/extdata/OSD/E/ERNEST.json +++ b/inst/extdata/OSD/E/ERNEST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/E/ESCONDIDO.json b/inst/extdata/OSD/E/ESCONDIDO.json index 82abbc5eb4..9ff8870d22 100644 --- a/inst/extdata/OSD/E/ESCONDIDO.json +++ b/inst/extdata/OSD/E/ESCONDIDO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/ESKIMINZIN.json b/inst/extdata/OSD/E/ESKIMINZIN.json index 0dba5a7475..d4733bc4af 100644 --- a/inst/extdata/OSD/E/ESKIMINZIN.json +++ b/inst/extdata/OSD/E/ESKIMINZIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ESPARTO.json b/inst/extdata/OSD/E/ESPARTO.json index df19c548a4..9274524cdf 100644 --- a/inst/extdata/OSD/E/ESPARTO.json +++ b/inst/extdata/OSD/E/ESPARTO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/ESPELIE.json b/inst/extdata/OSD/E/ESPELIE.json index 4da441eb6d..847902cd55 100644 --- a/inst/extdata/OSD/E/ESPELIE.json +++ b/inst/extdata/OSD/E/ESPELIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ESSEVILLE.json b/inst/extdata/OSD/E/ESSEVILLE.json index 42d0268ec3..4ffcb5fb33 100644 --- a/inst/extdata/OSD/E/ESSEVILLE.json +++ b/inst/extdata/OSD/E/ESSEVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ESSEXVILLE.json b/inst/extdata/OSD/E/ESSEXVILLE.json index d7a4404cf5..b346272c3e 100644 --- a/inst/extdata/OSD/E/ESSEXVILLE.json +++ b/inst/extdata/OSD/E/ESSEXVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/ETHELMAN.json b/inst/extdata/OSD/E/ETHELMAN.json index d9af2550d4..7f709de92e 100644 --- a/inst/extdata/OSD/E/ETHELMAN.json +++ b/inst/extdata/OSD/E/ETHELMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/ETHETE.json b/inst/extdata/OSD/E/ETHETE.json index fb20f7a18c..6b711227ac 100644 --- a/inst/extdata/OSD/E/ETHETE.json +++ b/inst/extdata/OSD/E/ETHETE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/ETTRICK.json b/inst/extdata/OSD/E/ETTRICK.json index 22dc7a8492..2f3d114117 100644 --- a/inst/extdata/OSD/E/ETTRICK.json +++ b/inst/extdata/OSD/E/ETTRICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/E/EUDORA.json b/inst/extdata/OSD/E/EUDORA.json index c3d5746d4e..4be9cc5e80 100644 --- a/inst/extdata/OSD/E/EUDORA.json +++ b/inst/extdata/OSD/E/EUDORA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/E/EUFAULA.json b/inst/extdata/OSD/E/EUFAULA.json index 69f9cd4709..a0d6abb794 100644 --- a/inst/extdata/OSD/E/EUFAULA.json +++ b/inst/extdata/OSD/E/EUFAULA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/E/EVA.json b/inst/extdata/OSD/E/EVA.json index 437d75d942..c92c108cf0 100644 --- a/inst/extdata/OSD/E/EVA.json +++ b/inst/extdata/OSD/E/EVA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/E/EVART.json b/inst/extdata/OSD/E/EVART.json index 01e7646bd5..87bee64a01 100644 --- a/inst/extdata/OSD/E/EVART.json +++ b/inst/extdata/OSD/E/EVART.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EWAN.json b/inst/extdata/OSD/E/EWAN.json index 28ba04c1c7..ac7a442da4 100644 --- a/inst/extdata/OSD/E/EWAN.json +++ b/inst/extdata/OSD/E/EWAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/E/EXCELLO.json b/inst/extdata/OSD/E/EXCELLO.json index 0cbd840bd6..9d763340f2 100644 --- a/inst/extdata/OSD/E/EXCELLO.json +++ b/inst/extdata/OSD/E/EXCELLO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/E/EXEL.json b/inst/extdata/OSD/E/EXEL.json index d5f8c5feec..d58864a464 100644 --- a/inst/extdata/OSD/E/EXEL.json +++ b/inst/extdata/OSD/E/EXEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/E/EXLINE.json b/inst/extdata/OSD/E/EXLINE.json index c5df3765a8..c9391c200e 100644 --- a/inst/extdata/OSD/E/EXLINE.json +++ b/inst/extdata/OSD/E/EXLINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/E/EYERBOW.json b/inst/extdata/OSD/E/EYERBOW.json index 200a18258f..e2c816f984 100644 --- a/inst/extdata/OSD/E/EYERBOW.json +++ b/inst/extdata/OSD/E/EYERBOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/E/EZBIN.json b/inst/extdata/OSD/E/EZBIN.json index 8819c6ed3d..79734e808e 100644 --- a/inst/extdata/OSD/E/EZBIN.json +++ b/inst/extdata/OSD/E/EZBIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FADDIN.json b/inst/extdata/OSD/F/FADDIN.json index 9521496069..cdc31fa110 100644 --- a/inst/extdata/OSD/F/FADDIN.json +++ b/inst/extdata/OSD/F/FADDIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/F/FAIRBURN.json b/inst/extdata/OSD/F/FAIRBURN.json index 398f0e53c8..fcfdc51c29 100644 --- a/inst/extdata/OSD/F/FAIRBURN.json +++ b/inst/extdata/OSD/F/FAIRBURN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FAIRPORT.json b/inst/extdata/OSD/F/FAIRPORT.json index 7636432aa9..30de5228cc 100644 --- a/inst/extdata/OSD/F/FAIRPORT.json +++ b/inst/extdata/OSD/F/FAIRPORT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FAIRY.json b/inst/extdata/OSD/F/FAIRY.json index d0d351447a..c58becba81 100644 --- a/inst/extdata/OSD/F/FAIRY.json +++ b/inst/extdata/OSD/F/FAIRY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FAIRYDELL.json b/inst/extdata/OSD/F/FAIRYDELL.json index 682044fde6..3f8b96aaf3 100644 --- a/inst/extdata/OSD/F/FAIRYDELL.json +++ b/inst/extdata/OSD/F/FAIRYDELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FALCON.json b/inst/extdata/OSD/F/FALCON.json index d00b916411..0a784684f6 100644 --- a/inst/extdata/OSD/F/FALCON.json +++ b/inst/extdata/OSD/F/FALCON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FALLEAF.json b/inst/extdata/OSD/F/FALLEAF.json index ef43021b85..9a50dd6853 100644 --- a/inst/extdata/OSD/F/FALLEAF.json +++ b/inst/extdata/OSD/F/FALLEAF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FALLSAM.json b/inst/extdata/OSD/F/FALLSAM.json index 116341c7f4..69dc4d7350 100644 --- a/inst/extdata/OSD/F/FALLSAM.json +++ b/inst/extdata/OSD/F/FALLSAM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FALULA.json b/inst/extdata/OSD/F/FALULA.json index b321792a18..142e8b7140 100644 --- a/inst/extdata/OSD/F/FALULA.json +++ b/inst/extdata/OSD/F/FALULA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FANCHER.json b/inst/extdata/OSD/F/FANCHER.json index e9edc4b9be..ecb983e832 100644 --- a/inst/extdata/OSD/F/FANCHER.json +++ b/inst/extdata/OSD/F/FANCHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FANNO.json b/inst/extdata/OSD/F/FANNO.json index 78e5f99630..903e80ef6f 100644 --- a/inst/extdata/OSD/F/FANNO.json +++ b/inst/extdata/OSD/F/FANNO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FANU.json b/inst/extdata/OSD/F/FANU.json index 70b34116b9..02a47aed5a 100644 --- a/inst/extdata/OSD/F/FANU.json +++ b/inst/extdata/OSD/F/FANU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FARB.json b/inst/extdata/OSD/F/FARB.json index cc83eba742..1bfdda36a7 100644 --- a/inst/extdata/OSD/F/FARB.json +++ b/inst/extdata/OSD/F/FARB.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively or somewhat excessively", - "drainage_overview": "excessively or somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/F/FARGO.json b/inst/extdata/OSD/F/FARGO.json index a9a1dd7042..1e1bc5e7c1 100644 --- a/inst/extdata/OSD/F/FARGO.json +++ b/inst/extdata/OSD/F/FARGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FARISITA.json b/inst/extdata/OSD/F/FARISITA.json index 9ce37218d5..b0af5a5ce1 100644 --- a/inst/extdata/OSD/F/FARISITA.json +++ b/inst/extdata/OSD/F/FARISITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FARMINGTON.json b/inst/extdata/OSD/F/FARMINGTON.json index 8c2929414d..f7b57bac7e 100644 --- a/inst/extdata/OSD/F/FARMINGTON.json +++ b/inst/extdata/OSD/F/FARMINGTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FARMSWORTH.json b/inst/extdata/OSD/F/FARMSWORTH.json index 86c09ff2df..af20fee49f 100644 --- a/inst/extdata/OSD/F/FARMSWORTH.json +++ b/inst/extdata/OSD/F/FARMSWORTH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/F/FARVIEW.json b/inst/extdata/OSD/F/FARVIEW.json index 05b6d9b070..c4170f0f3d 100644 --- a/inst/extdata/OSD/F/FARVIEW.json +++ b/inst/extdata/OSD/F/FARVIEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FATTIG.json b/inst/extdata/OSD/F/FATTIG.json index d6fe8d7e74..62f46591f6 100644 --- a/inst/extdata/OSD/F/FATTIG.json +++ b/inst/extdata/OSD/F/FATTIG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FAXON.json b/inst/extdata/OSD/F/FAXON.json index c653cbba73..763439d562 100644 --- a/inst/extdata/OSD/F/FAXON.json +++ b/inst/extdata/OSD/F/FAXON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FEEDER.json b/inst/extdata/OSD/F/FEEDER.json index 5bb021c1ab..154adc75da 100644 --- a/inst/extdata/OSD/F/FEEDER.json +++ b/inst/extdata/OSD/F/FEEDER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FELDA.json b/inst/extdata/OSD/F/FELDA.json index a5b217cf69..09301a0df2 100644 --- a/inst/extdata/OSD/F/FELDA.json +++ b/inst/extdata/OSD/F/FELDA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FELIX.json b/inst/extdata/OSD/F/FELIX.json index 8d0b3c4e8d..aaff2b7b39 100644 --- a/inst/extdata/OSD/F/FELIX.json +++ b/inst/extdata/OSD/F/FELIX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/F/FELLOWSHIP.json b/inst/extdata/OSD/F/FELLOWSHIP.json index 9fc89c0a79..233f36ce9f 100644 --- a/inst/extdata/OSD/F/FELLOWSHIP.json +++ b/inst/extdata/OSD/F/FELLOWSHIP.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FELTA.json b/inst/extdata/OSD/F/FELTA.json index ede05df2b3..b928f04e42 100644 --- a/inst/extdata/OSD/F/FELTA.json +++ b/inst/extdata/OSD/F/FELTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FELTHAM.json b/inst/extdata/OSD/F/FELTHAM.json index e606346049..b775be03ec 100644 --- a/inst/extdata/OSD/F/FELTHAM.json +++ b/inst/extdata/OSD/F/FELTHAM.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FENANDER.json b/inst/extdata/OSD/F/FENANDER.json index 7cd0fb600f..6b5cee5e0f 100644 --- a/inst/extdata/OSD/F/FENANDER.json +++ b/inst/extdata/OSD/F/FENANDER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FERNEY.json b/inst/extdata/OSD/F/FERNEY.json index 01f6efa82c..4e15c5fe9a 100644 --- a/inst/extdata/OSD/F/FERNEY.json +++ b/inst/extdata/OSD/F/FERNEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/F/FERN_CLIFF.json b/inst/extdata/OSD/F/FERN_CLIFF.json index 552b5768d4..ec24672587 100644 --- a/inst/extdata/OSD/F/FERN_CLIFF.json +++ b/inst/extdata/OSD/F/FERN_CLIFF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FERRIS.json b/inst/extdata/OSD/F/FERRIS.json index dc26034c64..994dd8ad5b 100644 --- a/inst/extdata/OSD/F/FERRIS.json +++ b/inst/extdata/OSD/F/FERRIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FIGGS.json b/inst/extdata/OSD/F/FIGGS.json index 753304dcb6..5b05ed771a 100644 --- a/inst/extdata/OSD/F/FIGGS.json +++ b/inst/extdata/OSD/F/FIGGS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/F/FILAREE.json b/inst/extdata/OSD/F/FILAREE.json index a9f5fbfcd2..bb83f57662 100644 --- a/inst/extdata/OSD/F/FILAREE.json +++ b/inst/extdata/OSD/F/FILAREE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively to well", - "drainage_overview": "somewhat excessively to well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FILLEY.json b/inst/extdata/OSD/F/FILLEY.json index ab48e68216..f5bf3bd700 100644 --- a/inst/extdata/OSD/F/FILLEY.json +++ b/inst/extdata/OSD/F/FILLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FINN.json b/inst/extdata/OSD/F/FINN.json index 1f5160740d..3940136d2f 100644 --- a/inst/extdata/OSD/F/FINN.json +++ b/inst/extdata/OSD/F/FINN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FINNERTY.json b/inst/extdata/OSD/F/FINNERTY.json index 96b11fdc31..793aeb3db3 100644 --- a/inst/extdata/OSD/F/FINNERTY.json +++ b/inst/extdata/OSD/F/FINNERTY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FIRMAGE.json b/inst/extdata/OSD/F/FIRMAGE.json index 6ffc4e9449..00ca1f1ad6 100644 --- a/inst/extdata/OSD/F/FIRMAGE.json +++ b/inst/extdata/OSD/F/FIRMAGE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FIVELAKES.json b/inst/extdata/OSD/F/FIVELAKES.json index c782f66d4b..0c78d36a09 100644 --- a/inst/extdata/OSD/F/FIVELAKES.json +++ b/inst/extdata/OSD/F/FIVELAKES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FIVEMILE.json b/inst/extdata/OSD/F/FIVEMILE.json index 223d54bebe..73c2ec523b 100644 --- a/inst/extdata/OSD/F/FIVEMILE.json +++ b/inst/extdata/OSD/F/FIVEMILE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FIVES.json b/inst/extdata/OSD/F/FIVES.json index 4686e43f03..3ecb926840 100644 --- a/inst/extdata/OSD/F/FIVES.json +++ b/inst/extdata/OSD/F/FIVES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FLEISCHMANN.json b/inst/extdata/OSD/F/FLEISCHMANN.json index b0e199f222..417ba83d4a 100644 --- a/inst/extdata/OSD/F/FLEISCHMANN.json +++ b/inst/extdata/OSD/F/FLEISCHMANN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FLOM.json b/inst/extdata/OSD/F/FLOM.json index 423612d23b..0f318d1742 100644 --- a/inst/extdata/OSD/F/FLOM.json +++ b/inst/extdata/OSD/F/FLOM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FLUETSCH.json b/inst/extdata/OSD/F/FLUETSCH.json index de44798371..4f39338e80 100644 --- a/inst/extdata/OSD/F/FLUETSCH.json +++ b/inst/extdata/OSD/F/FLUETSCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FLYWAY.json b/inst/extdata/OSD/F/FLYWAY.json index 368413c043..44b35c069b 100644 --- a/inst/extdata/OSD/F/FLYWAY.json +++ b/inst/extdata/OSD/F/FLYWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/F/FOLA.json b/inst/extdata/OSD/F/FOLA.json index c1a5feac4b..2906a91761 100644 --- a/inst/extdata/OSD/F/FOLA.json +++ b/inst/extdata/OSD/F/FOLA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/F/FONDIS.json b/inst/extdata/OSD/F/FONDIS.json index 40e1975def..f9325201b1 100644 --- a/inst/extdata/OSD/F/FONDIS.json +++ b/inst/extdata/OSD/F/FONDIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FOOLHEN.json b/inst/extdata/OSD/F/FOOLHEN.json index 1936f9f5b1..401ce8d7c4 100644 --- a/inst/extdata/OSD/F/FOOLHEN.json +++ b/inst/extdata/OSD/F/FOOLHEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FORADA.json b/inst/extdata/OSD/F/FORADA.json index 59f789a50a..b7ca438125 100644 --- a/inst/extdata/OSD/F/FORADA.json +++ b/inst/extdata/OSD/F/FORADA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FORT_NECK.json b/inst/extdata/OSD/F/FORT_NECK.json index 4e6ed21457..f755c8907d 100644 --- a/inst/extdata/OSD/F/FORT_NECK.json +++ b/inst/extdata/OSD/F/FORT_NECK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/F/FOSSUM.json b/inst/extdata/OSD/F/FOSSUM.json index 2492e05fda..bb9a55338c 100644 --- a/inst/extdata/OSD/F/FOSSUM.json +++ b/inst/extdata/OSD/F/FOSSUM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FOSTER.json b/inst/extdata/OSD/F/FOSTER.json index a8cc9aa68f..aa53642762 100644 --- a/inst/extdata/OSD/F/FOSTER.json +++ b/inst/extdata/OSD/F/FOSTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FOUNDEM.json b/inst/extdata/OSD/F/FOUNDEM.json index dbbf3e5b13..22999ba9d1 100644 --- a/inst/extdata/OSD/F/FOUNDEM.json +++ b/inst/extdata/OSD/F/FOUNDEM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FOURME.json b/inst/extdata/OSD/F/FOURME.json index 3a3fd13b87..a12d44339d 100644 --- a/inst/extdata/OSD/F/FOURME.json +++ b/inst/extdata/OSD/F/FOURME.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FOURMILE.json b/inst/extdata/OSD/F/FOURMILE.json index 16d8abb5f4..7ff26e7773 100644 --- a/inst/extdata/OSD/F/FOURMILE.json +++ b/inst/extdata/OSD/F/FOURMILE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FOUR_STAR.json b/inst/extdata/OSD/F/FOUR_STAR.json index 754a2990b3..0f477f3879 100644 --- a/inst/extdata/OSD/F/FOUR_STAR.json +++ b/inst/extdata/OSD/F/FOUR_STAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FOXWORTH.json b/inst/extdata/OSD/F/FOXWORTH.json index 6d2151459f..f4fb1b8048 100644 --- a/inst/extdata/OSD/F/FOXWORTH.json +++ b/inst/extdata/OSD/F/FOXWORTH.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well to somewhat excessively" + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FOX_CREEK.json b/inst/extdata/OSD/F/FOX_CREEK.json index 2a41fce373..d13062b3e6 100644 --- a/inst/extdata/OSD/F/FOX_CREEK.json +++ b/inst/extdata/OSD/F/FOX_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/F/FRAGUA.json b/inst/extdata/OSD/F/FRAGUA.json index 74d3a77cce..ae13c836d6 100644 --- a/inst/extdata/OSD/F/FRAGUA.json +++ b/inst/extdata/OSD/F/FRAGUA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and well", - "drainage_overview": "somewhat excessively and well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FRANDSEN.json b/inst/extdata/OSD/F/FRANDSEN.json index bf14226da1..a94d15ab60 100644 --- a/inst/extdata/OSD/F/FRANDSEN.json +++ b/inst/extdata/OSD/F/FRANDSEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FREDON.json b/inst/extdata/OSD/F/FREDON.json index c0b51f6086..b26059f178 100644 --- a/inst/extdata/OSD/F/FREDON.json +++ b/inst/extdata/OSD/F/FREDON.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/F/FRENCH.json b/inst/extdata/OSD/F/FRENCH.json index 56d6014131..21fe212935 100644 --- a/inst/extdata/OSD/F/FRENCH.json +++ b/inst/extdata/OSD/F/FRENCH.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/F/FREZNIK.json b/inst/extdata/OSD/F/FREZNIK.json index 40cb6cbaeb..41bf38da7e 100644 --- a/inst/extdata/OSD/F/FREZNIK.json +++ b/inst/extdata/OSD/F/FREZNIK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FRIANA.json b/inst/extdata/OSD/F/FRIANA.json index f455d7d17a..5d10603cc7 100644 --- a/inst/extdata/OSD/F/FRIANA.json +++ b/inst/extdata/OSD/F/FRIANA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FRIBERG.json b/inst/extdata/OSD/F/FRIBERG.json index 66a77c479b..bbf209ea79 100644 --- a/inst/extdata/OSD/F/FRIBERG.json +++ b/inst/extdata/OSD/F/FRIBERG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FRIO.json b/inst/extdata/OSD/F/FRIO.json index 495d6d0700..a3bf638a8d 100644 --- a/inst/extdata/OSD/F/FRIO.json +++ b/inst/extdata/OSD/F/FRIO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FROBERG.json b/inst/extdata/OSD/F/FROBERG.json index 89a693bfa8..67b88e9891 100644 --- a/inst/extdata/OSD/F/FROBERG.json +++ b/inst/extdata/OSD/F/FROBERG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/F/FRUITLAND.json b/inst/extdata/OSD/F/FRUITLAND.json index 49ee61a849..7d8eeb7b6b 100644 --- a/inst/extdata/OSD/F/FRUITLAND.json +++ b/inst/extdata/OSD/F/FRUITLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/F/FRYDEK.json b/inst/extdata/OSD/F/FRYDEK.json index bb0bbd6f07..6f3d1d33a3 100644 --- a/inst/extdata/OSD/F/FRYDEK.json +++ b/inst/extdata/OSD/F/FRYDEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/F/FRYE.json b/inst/extdata/OSD/F/FRYE.json index 02b6ff1e41..66bf79067f 100644 --- a/inst/extdata/OSD/F/FRYE.json +++ b/inst/extdata/OSD/F/FRYE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FRYREAR.json b/inst/extdata/OSD/F/FRYREAR.json index 0d6fe5da48..3608ef8d51 100644 --- a/inst/extdata/OSD/F/FRYREAR.json +++ b/inst/extdata/OSD/F/FRYREAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FUERA.json b/inst/extdata/OSD/F/FUERA.json index f15912c94d..26621194fc 100644 --- a/inst/extdata/OSD/F/FUERA.json +++ b/inst/extdata/OSD/F/FUERA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/F/FULCHER.json b/inst/extdata/OSD/F/FULCHER.json index a6b8f791eb..24c1e2e1d4 100644 --- a/inst/extdata/OSD/F/FULCHER.json +++ b/inst/extdata/OSD/F/FULCHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/F/FUNSTON.json b/inst/extdata/OSD/F/FUNSTON.json index 061542fdfa..79cc39da6b 100644 --- a/inst/extdata/OSD/F/FUNSTON.json +++ b/inst/extdata/OSD/F/FUNSTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FURY.json b/inst/extdata/OSD/F/FURY.json index b54f7979bc..b7de87f533 100644 --- a/inst/extdata/OSD/F/FURY.json +++ b/inst/extdata/OSD/F/FURY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/F/FUSULINA.json b/inst/extdata/OSD/F/FUSULINA.json index fcaaf354ea..4fec62b0f0 100644 --- a/inst/extdata/OSD/F/FUSULINA.json +++ b/inst/extdata/OSD/F/FUSULINA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GABBS.json b/inst/extdata/OSD/G/GABBS.json index c43b3fdeed..67fdc0373a 100644 --- a/inst/extdata/OSD/G/GABBS.json +++ b/inst/extdata/OSD/G/GABBS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GABEL.json b/inst/extdata/OSD/G/GABEL.json index 49436db648..ee7c4ab4d4 100644 --- a/inst/extdata/OSD/G/GABEL.json +++ b/inst/extdata/OSD/G/GABEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GAINES.json b/inst/extdata/OSD/G/GAINES.json index b55672bb1a..6c98027e4c 100644 --- a/inst/extdata/OSD/G/GAINES.json +++ b/inst/extdata/OSD/G/GAINES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GALOO.json b/inst/extdata/OSD/G/GALOO.json index 9a934ced96..efd8076b03 100644 --- a/inst/extdata/OSD/G/GALOO.json +++ b/inst/extdata/OSD/G/GALOO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively", - "drainage_overview": "somewhat excessively to excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/G/GALWAY.json b/inst/extdata/OSD/G/GALWAY.json index 514bcfc872..905d5ad249 100644 --- a/inst/extdata/OSD/G/GALWAY.json +++ b/inst/extdata/OSD/G/GALWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GANNETT.json b/inst/extdata/OSD/G/GANNETT.json index 835e602e79..220e911ada 100644 --- a/inst/extdata/OSD/G/GANNETT.json +++ b/inst/extdata/OSD/G/GANNETT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GAP.json b/inst/extdata/OSD/G/GAP.json index 091f73138d..dca2b62a55 100644 --- a/inst/extdata/OSD/G/GAP.json +++ b/inst/extdata/OSD/G/GAP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GAPPMAYER.json b/inst/extdata/OSD/G/GAPPMAYER.json index 52b4d64766..e7ed294c0d 100644 --- a/inst/extdata/OSD/G/GAPPMAYER.json +++ b/inst/extdata/OSD/G/GAPPMAYER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GARBER.json b/inst/extdata/OSD/G/GARBER.json index 8a76fd8172..e36bca1b16 100644 --- a/inst/extdata/OSD/G/GARBER.json +++ b/inst/extdata/OSD/G/GARBER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GARDENA.json b/inst/extdata/OSD/G/GARDENA.json index 0e09303138..1e69b6af2e 100644 --- a/inst/extdata/OSD/G/GARDENA.json +++ b/inst/extdata/OSD/G/GARDENA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GARDENCITY.json b/inst/extdata/OSD/G/GARDENCITY.json index 84c1b5ae58..61dba1cada 100644 --- a/inst/extdata/OSD/G/GARDENCITY.json +++ b/inst/extdata/OSD/G/GARDENCITY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GARDINER.json b/inst/extdata/OSD/G/GARDINER.json index 2944f91e76..68ab860185 100644 --- a/inst/extdata/OSD/G/GARDINER.json +++ b/inst/extdata/OSD/G/GARDINER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GAREY.json b/inst/extdata/OSD/G/GAREY.json index 6c71cead46..8a5913dc80 100644 --- a/inst/extdata/OSD/G/GAREY.json +++ b/inst/extdata/OSD/G/GAREY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GARITA.json b/inst/extdata/OSD/G/GARITA.json index 9377df93f4..36e8e5e7c9 100644 --- a/inst/extdata/OSD/G/GARITA.json +++ b/inst/extdata/OSD/G/GARITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GARR.json b/inst/extdata/OSD/G/GARR.json index 7201a6dd78..2a86810186 100644 --- a/inst/extdata/OSD/G/GARR.json +++ b/inst/extdata/OSD/G/GARR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GARRETT.json b/inst/extdata/OSD/G/GARRETT.json index 45cbcd0876..94b69c8638 100644 --- a/inst/extdata/OSD/G/GARRETT.json +++ b/inst/extdata/OSD/G/GARRETT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GARSID.json b/inst/extdata/OSD/G/GARSID.json index f3b035e45c..2fc3ab8713 100644 --- a/inst/extdata/OSD/G/GARSID.json +++ b/inst/extdata/OSD/G/GARSID.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GARVEN.json b/inst/extdata/OSD/G/GARVEN.json index 5e38e3f63a..924f4c3fc2 100644 --- a/inst/extdata/OSD/G/GARVEN.json +++ b/inst/extdata/OSD/G/GARVEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GARVIN.json b/inst/extdata/OSD/G/GARVIN.json index accc537483..e8d57e400b 100644 --- a/inst/extdata/OSD/G/GARVIN.json +++ b/inst/extdata/OSD/G/GARVIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GARWOOD.json b/inst/extdata/OSD/G/GARWOOD.json index f6c361c922..c0e4dfcbfc 100644 --- a/inst/extdata/OSD/G/GARWOOD.json +++ b/inst/extdata/OSD/G/GARWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GARZA.json b/inst/extdata/OSD/G/GARZA.json index f71c6f829d..7c6db9d06e 100644 --- a/inst/extdata/OSD/G/GARZA.json +++ b/inst/extdata/OSD/G/GARZA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GAS_CREEK.json b/inst/extdata/OSD/G/GAS_CREEK.json index 2409b3ce9e..edc315f212 100644 --- a/inst/extdata/OSD/G/GAS_CREEK.json +++ b/inst/extdata/OSD/G/GAS_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/G/GATES.json b/inst/extdata/OSD/G/GATES.json index 515d06b5f3..7acac50048 100644 --- a/inst/extdata/OSD/G/GATES.json +++ b/inst/extdata/OSD/G/GATES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GATESON.json b/inst/extdata/OSD/G/GATESON.json index 9b3d269ee6..e928566fb7 100644 --- a/inst/extdata/OSD/G/GATESON.json +++ b/inst/extdata/OSD/G/GATESON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GATEVIEW.json b/inst/extdata/OSD/G/GATEVIEW.json index 7ec82ed5c4..ff9ac30613 100644 --- a/inst/extdata/OSD/G/GATEVIEW.json +++ b/inst/extdata/OSD/G/GATEVIEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/G/GAY.json b/inst/extdata/OSD/G/GAY.json index 46a2c111d1..dddd2d4da5 100644 --- a/inst/extdata/OSD/G/GAY.json +++ b/inst/extdata/OSD/G/GAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GAYLESVILLE.json b/inst/extdata/OSD/G/GAYLESVILLE.json index 5b8e9f133b..163db443c8 100644 --- a/inst/extdata/OSD/G/GAYLESVILLE.json +++ b/inst/extdata/OSD/G/GAYLESVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/G/GAYLORD.json b/inst/extdata/OSD/G/GAYLORD.json index 9cb8b1d96f..3fce046b33 100644 --- a/inst/extdata/OSD/G/GAYLORD.json +++ b/inst/extdata/OSD/G/GAYLORD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GENEVA.json b/inst/extdata/OSD/G/GENEVA.json index daafa365c6..50c63a689a 100644 --- a/inst/extdata/OSD/G/GENEVA.json +++ b/inst/extdata/OSD/G/GENEVA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GERLANE.json b/inst/extdata/OSD/G/GERLANE.json index cabd4c6621..a99515dc5a 100644 --- a/inst/extdata/OSD/G/GERLANE.json +++ b/inst/extdata/OSD/G/GERLANE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GETZVILLE.json b/inst/extdata/OSD/G/GETZVILLE.json index 722046c026..f7967a1229 100644 --- a/inst/extdata/OSD/G/GETZVILLE.json +++ b/inst/extdata/OSD/G/GETZVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GIARCH.json b/inst/extdata/OSD/G/GIARCH.json index 2eabd5dcfa..1ff4f92e9a 100644 --- a/inst/extdata/OSD/G/GIARCH.json +++ b/inst/extdata/OSD/G/GIARCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GIBBLER.json b/inst/extdata/OSD/G/GIBBLER.json index 4958da238f..a35de27202 100644 --- a/inst/extdata/OSD/G/GIBBLER.json +++ b/inst/extdata/OSD/G/GIBBLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GIBRALTAR.json b/inst/extdata/OSD/G/GIBRALTAR.json index b8711af90e..8ae1ac0cb0 100644 --- a/inst/extdata/OSD/G/GIBRALTAR.json +++ b/inst/extdata/OSD/G/GIBRALTAR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GILCO.json b/inst/extdata/OSD/G/GILCO.json index 5ad26122d9..6e44923919 100644 --- a/inst/extdata/OSD/G/GILCO.json +++ b/inst/extdata/OSD/G/GILCO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GILCREST.json b/inst/extdata/OSD/G/GILCREST.json index d61f046148..db11068829 100644 --- a/inst/extdata/OSD/G/GILCREST.json +++ b/inst/extdata/OSD/G/GILCREST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/G/GILFORD.json b/inst/extdata/OSD/G/GILFORD.json index 8a66a43d64..d7b0fdee91 100644 --- a/inst/extdata/OSD/G/GILFORD.json +++ b/inst/extdata/OSD/G/GILFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GILLAND.json b/inst/extdata/OSD/G/GILLAND.json index 6faa4fbf21..b408ee2d46 100644 --- a/inst/extdata/OSD/G/GILLAND.json +++ b/inst/extdata/OSD/G/GILLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GILLETT_GROVE.json b/inst/extdata/OSD/G/GILLETT_GROVE.json index 7f0f95f3b0..22b7466247 100644 --- a/inst/extdata/OSD/G/GILLETT_GROVE.json +++ b/inst/extdata/OSD/G/GILLETT_GROVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GIRARDOT.json b/inst/extdata/OSD/G/GIRARDOT.json index 774eb3fed1..253ec2bc42 100644 --- a/inst/extdata/OSD/G/GIRARDOT.json +++ b/inst/extdata/OSD/G/GIRARDOT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/G/GLADEWATER.json b/inst/extdata/OSD/G/GLADEWATER.json index e41f101713..2a961f6740 100644 --- a/inst/extdata/OSD/G/GLADEWATER.json +++ b/inst/extdata/OSD/G/GLADEWATER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly, poorly, very poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/G/GLAWE.json b/inst/extdata/OSD/G/GLAWE.json index 1c833c2107..ab27bfd4f1 100644 --- a/inst/extdata/OSD/G/GLAWE.json +++ b/inst/extdata/OSD/G/GLAWE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GLAZE.json b/inst/extdata/OSD/G/GLAZE.json index 36e9825b5d..c04e0bf73b 100644 --- a/inst/extdata/OSD/G/GLAZE.json +++ b/inst/extdata/OSD/G/GLAZE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GLEAN.json b/inst/extdata/OSD/G/GLEAN.json index aca67db37f..e5357a0688 100644 --- a/inst/extdata/OSD/G/GLEAN.json +++ b/inst/extdata/OSD/G/GLEAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GLEASON.json b/inst/extdata/OSD/G/GLEASON.json index 546621bbcc..3c979898c1 100644 --- a/inst/extdata/OSD/G/GLEASON.json +++ b/inst/extdata/OSD/G/GLEASON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GLENDIVE.json b/inst/extdata/OSD/G/GLENDIVE.json index fa99081ad8..7845fd3a2e 100644 --- a/inst/extdata/OSD/G/GLENDIVE.json +++ b/inst/extdata/OSD/G/GLENDIVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GLENDORA.json b/inst/extdata/OSD/G/GLENDORA.json index cad071aa8a..53a2443fe2 100644 --- a/inst/extdata/OSD/G/GLENDORA.json +++ b/inst/extdata/OSD/G/GLENDORA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GLENFLORA.json b/inst/extdata/OSD/G/GLENFLORA.json index 0de6cee819..349c857b7f 100644 --- a/inst/extdata/OSD/G/GLENFLORA.json +++ b/inst/extdata/OSD/G/GLENFLORA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GLENTON.json b/inst/extdata/OSD/G/GLENTON.json index c51618bc36..e2394fca55 100644 --- a/inst/extdata/OSD/G/GLENTON.json +++ b/inst/extdata/OSD/G/GLENTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GLENVILLE.json b/inst/extdata/OSD/G/GLENVILLE.json index 78e5472ad5..ea7f4403c7 100644 --- a/inst/extdata/OSD/G/GLENVILLE.json +++ b/inst/extdata/OSD/G/GLENVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GLORIA.json b/inst/extdata/OSD/G/GLORIA.json index 6615e8f713..dd1a6833d8 100644 --- a/inst/extdata/OSD/G/GLORIA.json +++ b/inst/extdata/OSD/G/GLORIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GOESSEL.json b/inst/extdata/OSD/G/GOESSEL.json index 051788f407..3c09b3a113 100644 --- a/inst/extdata/OSD/G/GOESSEL.json +++ b/inst/extdata/OSD/G/GOESSEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GOLDENBELL.json b/inst/extdata/OSD/G/GOLDENBELL.json index 03dd8df428..5dd0ae4e94 100644 --- a/inst/extdata/OSD/G/GOLDENBELL.json +++ b/inst/extdata/OSD/G/GOLDENBELL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GOLDHEAD.json b/inst/extdata/OSD/G/GOLDHEAD.json index 8bdea2910a..8e0cf75fd4 100644 --- a/inst/extdata/OSD/G/GOLDHEAD.json +++ b/inst/extdata/OSD/G/GOLDHEAD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GOLDSTON.json b/inst/extdata/OSD/G/GOLDSTON.json index 68bae5bbc9..4dc037591d 100644 --- a/inst/extdata/OSD/G/GOLDSTON.json +++ b/inst/extdata/OSD/G/GOLDSTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/G/GOLD_CREEK.json b/inst/extdata/OSD/G/GOLD_CREEK.json index 5a64167566..4eb80b32c4 100644 --- a/inst/extdata/OSD/G/GOLD_CREEK.json +++ b/inst/extdata/OSD/G/GOLD_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GOLETA.json b/inst/extdata/OSD/G/GOLETA.json index 16b4cebc97..07a38e1e51 100644 --- a/inst/extdata/OSD/G/GOLETA.json +++ b/inst/extdata/OSD/G/GOLETA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GOLTRY.json b/inst/extdata/OSD/G/GOLTRY.json index 03151f6732..7a1dc4d1be 100644 --- a/inst/extdata/OSD/G/GOLTRY.json +++ b/inst/extdata/OSD/G/GOLTRY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GOODELL.json b/inst/extdata/OSD/G/GOODELL.json index 1396e20448..9163cfd4fd 100644 --- a/inst/extdata/OSD/G/GOODELL.json +++ b/inst/extdata/OSD/G/GOODELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GOODHOPE.json b/inst/extdata/OSD/G/GOODHOPE.json index 9323d4f265..2bf670baa2 100644 --- a/inst/extdata/OSD/G/GOODHOPE.json +++ b/inst/extdata/OSD/G/GOODHOPE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GOOSEFLATS.json b/inst/extdata/OSD/G/GOOSEFLATS.json index 9190f3d123..dd61a10005 100644 --- a/inst/extdata/OSD/G/GOOSEFLATS.json +++ b/inst/extdata/OSD/G/GOOSEFLATS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GOOSE_CREEK.json b/inst/extdata/OSD/G/GOOSE_CREEK.json index e937c5528a..fb7423578d 100644 --- a/inst/extdata/OSD/G/GOOSE_CREEK.json +++ b/inst/extdata/OSD/G/GOOSE_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GORING.json b/inst/extdata/OSD/G/GORING.json index 4498662fde..5404d14123 100644 --- a/inst/extdata/OSD/G/GORING.json +++ b/inst/extdata/OSD/G/GORING.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GORMAN.json b/inst/extdata/OSD/G/GORMAN.json index d7ce0da5a8..2fde7c254d 100644 --- a/inst/extdata/OSD/G/GORMAN.json +++ b/inst/extdata/OSD/G/GORMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GOSHUTE.json b/inst/extdata/OSD/G/GOSHUTE.json index 5b44d7d8f6..fb51536d5d 100644 --- a/inst/extdata/OSD/G/GOSHUTE.json +++ b/inst/extdata/OSD/G/GOSHUTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GOTHO.json b/inst/extdata/OSD/G/GOTHO.json index 1f1100eeaf..303d89955d 100644 --- a/inst/extdata/OSD/G/GOTHO.json +++ b/inst/extdata/OSD/G/GOTHO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GOURLEY.json b/inst/extdata/OSD/G/GOURLEY.json index 8730b9a632..77659047af 100644 --- a/inst/extdata/OSD/G/GOURLEY.json +++ b/inst/extdata/OSD/G/GOURLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GOUVERNEUR.json b/inst/extdata/OSD/G/GOUVERNEUR.json index 1e7204b36d..cb2917e2ca 100644 --- a/inst/extdata/OSD/G/GOUVERNEUR.json +++ b/inst/extdata/OSD/G/GOUVERNEUR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively", - "drainage_overview": "excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/G/GOWKER.json b/inst/extdata/OSD/G/GOWKER.json index ced641b9d1..849fb5244c 100644 --- a/inst/extdata/OSD/G/GOWKER.json +++ b/inst/extdata/OSD/G/GOWKER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GRACEVILLE.json b/inst/extdata/OSD/G/GRACEVILLE.json index d7f3a2c86e..a3250df39f 100644 --- a/inst/extdata/OSD/G/GRACEVILLE.json +++ b/inst/extdata/OSD/G/GRACEVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GRAHAM.json b/inst/extdata/OSD/G/GRAHAM.json index 658f7da882..5964c0a521 100644 --- a/inst/extdata/OSD/G/GRAHAM.json +++ b/inst/extdata/OSD/G/GRAHAM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRAIL.json b/inst/extdata/OSD/G/GRAIL.json index 0c2f02df85..5934d0924e 100644 --- a/inst/extdata/OSD/G/GRAIL.json +++ b/inst/extdata/OSD/G/GRAIL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GRANBURY.json b/inst/extdata/OSD/G/GRANBURY.json index 62a20736a8..f7f2609f74 100644 --- a/inst/extdata/OSD/G/GRANBURY.json +++ b/inst/extdata/OSD/G/GRANBURY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/G/GRANBY.json b/inst/extdata/OSD/G/GRANBY.json index 8468028e48..c163fe79d2 100644 --- a/inst/extdata/OSD/G/GRANBY.json +++ b/inst/extdata/OSD/G/GRANBY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GRANDVIEW.json b/inst/extdata/OSD/G/GRANDVIEW.json index 83b1150278..1e49d0a982 100644 --- a/inst/extdata/OSD/G/GRANDVIEW.json +++ b/inst/extdata/OSD/G/GRANDVIEW.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well and well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GRANGE.json b/inst/extdata/OSD/G/GRANGE.json index 84c4dc9448..a57deb259b 100644 --- a/inst/extdata/OSD/G/GRANGE.json +++ b/inst/extdata/OSD/G/GRANGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/G/GRANO.json b/inst/extdata/OSD/G/GRANO.json index 6553735fe6..b977124423 100644 --- a/inst/extdata/OSD/G/GRANO.json +++ b/inst/extdata/OSD/G/GRANO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GRANT.json b/inst/extdata/OSD/G/GRANT.json index 1be7754a44..8b5d2dde02 100644 --- a/inst/extdata/OSD/G/GRANT.json +++ b/inst/extdata/OSD/G/GRANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRASSLAND.json b/inst/extdata/OSD/G/GRASSLAND.json index e2235f3019..f95743dfe2 100644 --- a/inst/extdata/OSD/G/GRASSLAND.json +++ b/inst/extdata/OSD/G/GRASSLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GRASSNA.json b/inst/extdata/OSD/G/GRASSNA.json index e974a941a7..b71f512b70 100644 --- a/inst/extdata/OSD/G/GRASSNA.json +++ b/inst/extdata/OSD/G/GRASSNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GRASSY_BUTTE.json b/inst/extdata/OSD/G/GRASSY_BUTTE.json index abe10d759e..cba3ad3947 100644 --- a/inst/extdata/OSD/G/GRASSY_BUTTE.json +++ b/inst/extdata/OSD/G/GRASSY_BUTTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/G/GRAYLOCK.json b/inst/extdata/OSD/G/GRAYLOCK.json index 246d7c452a..a1909310cb 100644 --- a/inst/extdata/OSD/G/GRAYLOCK.json +++ b/inst/extdata/OSD/G/GRAYLOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/G/GRAYPOINT.json b/inst/extdata/OSD/G/GRAYPOINT.json index 1d8f73d7e7..d51c51e0d3 100644 --- a/inst/extdata/OSD/G/GRAYPOINT.json +++ b/inst/extdata/OSD/G/GRAYPOINT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRAYSLAKE.json b/inst/extdata/OSD/G/GRAYSLAKE.json index 84a9c77e5e..07aa577bbe 100644 --- a/inst/extdata/OSD/G/GRAYSLAKE.json +++ b/inst/extdata/OSD/G/GRAYSLAKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/G/GREANEY.json b/inst/extdata/OSD/G/GREANEY.json index 5661d1603e..f616816d9c 100644 --- a/inst/extdata/OSD/G/GREANEY.json +++ b/inst/extdata/OSD/G/GREANEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GREAT_BAY.json b/inst/extdata/OSD/G/GREAT_BAY.json index 825d3018de..a80fe5550f 100644 --- a/inst/extdata/OSD/G/GREAT_BAY.json +++ b/inst/extdata/OSD/G/GREAT_BAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/G/GREAT_DITCH.json b/inst/extdata/OSD/G/GREAT_DITCH.json index c2d613a5ab..187f07dc11 100644 --- a/inst/extdata/OSD/G/GREAT_DITCH.json +++ b/inst/extdata/OSD/G/GREAT_DITCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/G/GREENLEAF.json b/inst/extdata/OSD/G/GREENLEAF.json index 4d318e4af1..56b6fa5f99 100644 --- a/inst/extdata/OSD/G/GREENLEAF.json +++ b/inst/extdata/OSD/G/GREENLEAF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GREENSON.json b/inst/extdata/OSD/G/GREENSON.json index 92db8407d6..386c298125 100644 --- a/inst/extdata/OSD/G/GREENSON.json +++ b/inst/extdata/OSD/G/GREENSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GREEN_RIVER.json b/inst/extdata/OSD/G/GREEN_RIVER.json index 57d28607b0..1c2f4ebabb 100644 --- a/inst/extdata/OSD/G/GREEN_RIVER.json +++ b/inst/extdata/OSD/G/GREEN_RIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GREYBACK.json b/inst/extdata/OSD/G/GREYBACK.json index d947384f6e..0eb470c4bb 100644 --- a/inst/extdata/OSD/G/GREYBACK.json +++ b/inst/extdata/OSD/G/GREYBACK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively to excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/G/GREYS.json b/inst/extdata/OSD/G/GREYS.json index 9f62c635ab..bbd7d8acfc 100644 --- a/inst/extdata/OSD/G/GREYS.json +++ b/inst/extdata/OSD/G/GREYS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRIEVES.json b/inst/extdata/OSD/G/GRIEVES.json index 12883b1bd2..5c032f8342 100644 --- a/inst/extdata/OSD/G/GRIEVES.json +++ b/inst/extdata/OSD/G/GRIEVES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/G/GRINDALL.json b/inst/extdata/OSD/G/GRINDALL.json index 16aa167686..930b657bb5 100644 --- a/inst/extdata/OSD/G/GRINDALL.json +++ b/inst/extdata/OSD/G/GRINDALL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/G/GRINDER.json b/inst/extdata/OSD/G/GRINDER.json index 57be99df9a..9b0f78b1a3 100644 --- a/inst/extdata/OSD/G/GRINDER.json +++ b/inst/extdata/OSD/G/GRINDER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRINTER.json b/inst/extdata/OSD/G/GRINTER.json index f1ae9773d5..a6ab545c50 100644 --- a/inst/extdata/OSD/G/GRINTER.json +++ b/inst/extdata/OSD/G/GRINTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GRIVER.json b/inst/extdata/OSD/G/GRIVER.json index b3059531a8..82bada369c 100644 --- a/inst/extdata/OSD/G/GRIVER.json +++ b/inst/extdata/OSD/G/GRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/G/GROSS.json b/inst/extdata/OSD/G/GROSS.json index c97b7212dd..12f7fbed02 100644 --- a/inst/extdata/OSD/G/GROSS.json +++ b/inst/extdata/OSD/G/GROSS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GROUSECREEK.json b/inst/extdata/OSD/G/GROUSECREEK.json index 65d819d1e4..0ff1f571f1 100644 --- a/inst/extdata/OSD/G/GROUSECREEK.json +++ b/inst/extdata/OSD/G/GROUSECREEK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GROWTON.json b/inst/extdata/OSD/G/GROWTON.json index 3a9a1d723e..836bf68576 100644 --- a/inst/extdata/OSD/G/GROWTON.json +++ b/inst/extdata/OSD/G/GROWTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GRYGLA.json b/inst/extdata/OSD/G/GRYGLA.json index 032e8cdace..97c2abe64d 100644 --- a/inst/extdata/OSD/G/GRYGLA.json +++ b/inst/extdata/OSD/G/GRYGLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUAJE.json b/inst/extdata/OSD/G/GUAJE.json index ebef685635..408ed01316 100644 --- a/inst/extdata/OSD/G/GUAJE.json +++ b/inst/extdata/OSD/G/GUAJE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GUANELLA.json b/inst/extdata/OSD/G/GUANELLA.json index dee6d0659c..54fce487e5 100644 --- a/inst/extdata/OSD/G/GUANELLA.json +++ b/inst/extdata/OSD/G/GUANELLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GUELPH.json b/inst/extdata/OSD/G/GUELPH.json index 29966e2182..6b41f473a2 100644 --- a/inst/extdata/OSD/G/GUELPH.json +++ b/inst/extdata/OSD/G/GUELPH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/G/GUFF.json b/inst/extdata/OSD/G/GUFF.json index d9e878401f..5e5cbd7015 100644 --- a/inst/extdata/OSD/G/GUFF.json +++ b/inst/extdata/OSD/G/GUFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUFFIN.json b/inst/extdata/OSD/G/GUFFIN.json index 90387daac8..c9284c3bfe 100644 --- a/inst/extdata/OSD/G/GUFFIN.json +++ b/inst/extdata/OSD/G/GUFFIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUGUAK.json b/inst/extdata/OSD/G/GUGUAK.json index 581f3724e3..dcf2af2c1a 100644 --- a/inst/extdata/OSD/G/GUGUAK.json +++ b/inst/extdata/OSD/G/GUGUAK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/G/GULF.json b/inst/extdata/OSD/G/GULF.json index 0e2eb1d94e..d887f82cdd 100644 --- a/inst/extdata/OSD/G/GULF.json +++ b/inst/extdata/OSD/G/GULF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUMZ.json b/inst/extdata/OSD/G/GUMZ.json index 8e08b36bac..6074c9dd37 100644 --- a/inst/extdata/OSD/G/GUMZ.json +++ b/inst/extdata/OSD/G/GUMZ.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUNBARREL.json b/inst/extdata/OSD/G/GUNBARREL.json index 0bf5e324f4..58167d5921 100644 --- a/inst/extdata/OSD/G/GUNBARREL.json +++ b/inst/extdata/OSD/G/GUNBARREL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUNNEL.json b/inst/extdata/OSD/G/GUNNEL.json index cdc0fef1e5..937352f3f6 100644 --- a/inst/extdata/OSD/G/GUNNEL.json +++ b/inst/extdata/OSD/G/GUNNEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/G/GUS.json b/inst/extdata/OSD/G/GUS.json index 1b86e11879..fac395a136 100644 --- a/inst/extdata/OSD/G/GUS.json +++ b/inst/extdata/OSD/G/GUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUSTIN.json b/inst/extdata/OSD/G/GUSTIN.json index deda3e7519..98f876937e 100644 --- a/inst/extdata/OSD/G/GUSTIN.json +++ b/inst/extdata/OSD/G/GUSTIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/G/GUY.json b/inst/extdata/OSD/G/GUY.json index 557272764c..68350dfb47 100644 --- a/inst/extdata/OSD/G/GUY.json +++ b/inst/extdata/OSD/G/GUY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/G/GUYTON.json b/inst/extdata/OSD/G/GUYTON.json index b246c4a8c5..3dca70ce09 100644 --- a/inst/extdata/OSD/G/GUYTON.json +++ b/inst/extdata/OSD/G/GUYTON.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/G/GYSTRUM.json b/inst/extdata/OSD/G/GYSTRUM.json index d6d24a0055..59f1ea4652 100644 --- a/inst/extdata/OSD/G/GYSTRUM.json +++ b/inst/extdata/OSD/G/GYSTRUM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAGENBARTH.json b/inst/extdata/OSD/H/HAGENBARTH.json index 1dbb651127..0656bd05d9 100644 --- a/inst/extdata/OSD/H/HAGENBARTH.json +++ b/inst/extdata/OSD/H/HAGENBARTH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAGGATT.json b/inst/extdata/OSD/H/HAGGATT.json index 9a3c460057..77d00fc631 100644 --- a/inst/extdata/OSD/H/HAGGATT.json +++ b/inst/extdata/OSD/H/HAGGATT.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HAIGHTS.json b/inst/extdata/OSD/H/HAIGHTS.json index 5fe085a465..315ec4dcc5 100644 --- a/inst/extdata/OSD/H/HAIGHTS.json +++ b/inst/extdata/OSD/H/HAIGHTS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HAIGLER.json b/inst/extdata/OSD/H/HAIGLER.json index c2f56b4f81..936540d8f9 100644 --- a/inst/extdata/OSD/H/HAIGLER.json +++ b/inst/extdata/OSD/H/HAIGLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HALII.json b/inst/extdata/OSD/H/HALII.json index 0d5b512f86..38ed5e60ca 100644 --- a/inst/extdata/OSD/H/HALII.json +++ b/inst/extdata/OSD/H/HALII.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well and well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HALL.json b/inst/extdata/OSD/H/HALL.json index 4c1b5402a0..1fe8146485 100644 --- a/inst/extdata/OSD/H/HALL.json +++ b/inst/extdata/OSD/H/HALL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HALLANDALE.json b/inst/extdata/OSD/H/HALLANDALE.json index 40d49627a9..fc47684b13 100644 --- a/inst/extdata/OSD/H/HALLANDALE.json +++ b/inst/extdata/OSD/H/HALLANDALE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HALLET.json b/inst/extdata/OSD/H/HALLET.json index 9c20890f0b..04d201bed2 100644 --- a/inst/extdata/OSD/H/HALLET.json +++ b/inst/extdata/OSD/H/HALLET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/H/HALLISON.json b/inst/extdata/OSD/H/HALLISON.json index 13189e2a27..45063fcc20 100644 --- a/inst/extdata/OSD/H/HALLISON.json +++ b/inst/extdata/OSD/H/HALLISON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HAMEL.json b/inst/extdata/OSD/H/HAMEL.json index 7f8cc26124..c5555335fe 100644 --- a/inst/extdata/OSD/H/HAMEL.json +++ b/inst/extdata/OSD/H/HAMEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/H/HANALEI.json b/inst/extdata/OSD/H/HANALEI.json index 121cd9b9b1..972ca56be2 100644 --- a/inst/extdata/OSD/H/HANALEI.json +++ b/inst/extdata/OSD/H/HANALEI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/H/HANLY.json b/inst/extdata/OSD/H/HANLY.json index 35ef764412..0acf553543 100644 --- a/inst/extdata/OSD/H/HANLY.json +++ b/inst/extdata/OSD/H/HANLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/H/HANOVER.json b/inst/extdata/OSD/H/HANOVER.json index 70bc0b2e40..6ae8cb9e30 100644 --- a/inst/extdata/OSD/H/HANOVER.json +++ b/inst/extdata/OSD/H/HANOVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HANS.json b/inst/extdata/OSD/H/HANS.json index b4481f99cd..21e3d9f4d4 100644 --- a/inst/extdata/OSD/H/HANS.json +++ b/inst/extdata/OSD/H/HANS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HANSKA.json b/inst/extdata/OSD/H/HANSKA.json index b8015c7fde..db41ec862a 100644 --- a/inst/extdata/OSD/H/HANSKA.json +++ b/inst/extdata/OSD/H/HANSKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HAPNEY.json b/inst/extdata/OSD/H/HAPNEY.json index ff8f6a95fd..efc99ef6a4 100644 --- a/inst/extdata/OSD/H/HAPNEY.json +++ b/inst/extdata/OSD/H/HAPNEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HAPPYHOLLOW.json b/inst/extdata/OSD/H/HAPPYHOLLOW.json index 3b737ecaf9..a3d8b2f958 100644 --- a/inst/extdata/OSD/H/HAPPYHOLLOW.json +++ b/inst/extdata/OSD/H/HAPPYHOLLOW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HAPPYISLES.json b/inst/extdata/OSD/H/HAPPYISLES.json index 1735516c6f..ebd7bcca47 100644 --- a/inst/extdata/OSD/H/HAPPYISLES.json +++ b/inst/extdata/OSD/H/HAPPYISLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well, somewhat poorly", + "drainage_overview": "well, moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/H/HARDING.json b/inst/extdata/OSD/H/HARDING.json index b96c6a1edf..37390c250a 100644 --- a/inst/extdata/OSD/H/HARDING.json +++ b/inst/extdata/OSD/H/HARDING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HARDISTER.json b/inst/extdata/OSD/H/HARDISTER.json index abec173985..0aab4adec5 100644 --- a/inst/extdata/OSD/H/HARDISTER.json +++ b/inst/extdata/OSD/H/HARDISTER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HARGREAVE.json b/inst/extdata/OSD/H/HARGREAVE.json index e0727eb8dc..ba1ae0f30a 100644 --- a/inst/extdata/OSD/H/HARGREAVE.json +++ b/inst/extdata/OSD/H/HARGREAVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HARJO.json b/inst/extdata/OSD/H/HARJO.json index 68d9bb0d9e..9b10db3c12 100644 --- a/inst/extdata/OSD/H/HARJO.json +++ b/inst/extdata/OSD/H/HARJO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/H/HARKERS.json b/inst/extdata/OSD/H/HARKERS.json index af889e6f64..af8a85484e 100644 --- a/inst/extdata/OSD/H/HARKERS.json +++ b/inst/extdata/OSD/H/HARKERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HARPER.json b/inst/extdata/OSD/H/HARPER.json index df06ac5ed4..b9f35117b4 100644 --- a/inst/extdata/OSD/H/HARPER.json +++ b/inst/extdata/OSD/H/HARPER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HARRAH.json b/inst/extdata/OSD/H/HARRAH.json index 53da57dd51..632ac02b1d 100644 --- a/inst/extdata/OSD/H/HARRAH.json +++ b/inst/extdata/OSD/H/HARRAH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HARRISBURG.json b/inst/extdata/OSD/H/HARRISBURG.json index b15ffba19b..bcbac66c37 100644 --- a/inst/extdata/OSD/H/HARRISBURG.json +++ b/inst/extdata/OSD/H/HARRISBURG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HARRISVILLE.json b/inst/extdata/OSD/H/HARRISVILLE.json index 4667c0edae..8c4bb16711 100644 --- a/inst/extdata/OSD/H/HARRISVILLE.json +++ b/inst/extdata/OSD/H/HARRISVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/H/HARSTON.json b/inst/extdata/OSD/H/HARSTON.json index 2d09e3c6bc..d1bea8ac02 100644 --- a/inst/extdata/OSD/H/HARSTON.json +++ b/inst/extdata/OSD/H/HARSTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HATTONTOWN.json b/inst/extdata/OSD/H/HATTONTOWN.json index 956d45b489..506bbf8b01 100644 --- a/inst/extdata/OSD/H/HATTONTOWN.json +++ b/inst/extdata/OSD/H/HATTONTOWN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAUGAN.json b/inst/extdata/OSD/H/HAUGAN.json index b46068cdb3..96fb3ed78e 100644 --- a/inst/extdata/OSD/H/HAUGAN.json +++ b/inst/extdata/OSD/H/HAUGAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAVERLY.json b/inst/extdata/OSD/H/HAVERLY.json index 3752454eaf..8a88cd40f9 100644 --- a/inst/extdata/OSD/H/HAVERLY.json +++ b/inst/extdata/OSD/H/HAVERLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/H/HAVRELON.json b/inst/extdata/OSD/H/HAVRELON.json index fff3e0f5be..b0f50e7caa 100644 --- a/inst/extdata/OSD/H/HAVRELON.json +++ b/inst/extdata/OSD/H/HAVRELON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HAWKEYE.json b/inst/extdata/OSD/H/HAWKEYE.json index 6d2cff366a..0ba44c742a 100644 --- a/inst/extdata/OSD/H/HAWKEYE.json +++ b/inst/extdata/OSD/H/HAWKEYE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAWKSNEST.json b/inst/extdata/OSD/H/HAWKSNEST.json index d8b9c51912..3d15dc0a19 100644 --- a/inst/extdata/OSD/H/HAWKSNEST.json +++ b/inst/extdata/OSD/H/HAWKSNEST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HAYCAMP.json b/inst/extdata/OSD/H/HAYCAMP.json index 90a0eb27d0..bc8754eedb 100644 --- a/inst/extdata/OSD/H/HAYCAMP.json +++ b/inst/extdata/OSD/H/HAYCAMP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HAYMARKET.json b/inst/extdata/OSD/H/HAYMARKET.json index f276047fc4..8c2a013611 100644 --- a/inst/extdata/OSD/H/HAYMARKET.json +++ b/inst/extdata/OSD/H/HAYMARKET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HAYMONT.json b/inst/extdata/OSD/H/HAYMONT.json index bd25486a23..0168d34147 100644 --- a/inst/extdata/OSD/H/HAYMONT.json +++ b/inst/extdata/OSD/H/HAYMONT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HEADQUARTERS.json b/inst/extdata/OSD/H/HEADQUARTERS.json index 0842a3195a..61dcf246fc 100644 --- a/inst/extdata/OSD/H/HEADQUARTERS.json +++ b/inst/extdata/OSD/H/HEADQUARTERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HEADRICK.json b/inst/extdata/OSD/H/HEADRICK.json index cf6aca749e..99f8870824 100644 --- a/inst/extdata/OSD/H/HEADRICK.json +++ b/inst/extdata/OSD/H/HEADRICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/H/HEATON.json b/inst/extdata/OSD/H/HEATON.json index 8692260095..29ce4b0392 100644 --- a/inst/extdata/OSD/H/HEATON.json +++ b/inst/extdata/OSD/H/HEATON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HEDMAN.json b/inst/extdata/OSD/H/HEDMAN.json index 3bce7aa220..9b3de6d95e 100644 --- a/inst/extdata/OSD/H/HEDMAN.json +++ b/inst/extdata/OSD/H/HEDMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HEFLIN.json b/inst/extdata/OSD/H/HEFLIN.json index 7e7a9e976b..e6c68dd950 100644 --- a/inst/extdata/OSD/H/HEFLIN.json +++ b/inst/extdata/OSD/H/HEFLIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HEGLAR.json b/inst/extdata/OSD/H/HEGLAR.json index 4c8d935473..1399cd7041 100644 --- a/inst/extdata/OSD/H/HEGLAR.json +++ b/inst/extdata/OSD/H/HEGLAR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HEIDEN.json b/inst/extdata/OSD/H/HEIDEN.json index 5cff48b5db..b80ae10e91 100644 --- a/inst/extdata/OSD/H/HEIDEN.json +++ b/inst/extdata/OSD/H/HEIDEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HELDT.json b/inst/extdata/OSD/H/HELDT.json index 9f8c2c344b..6e7287cf43 100644 --- a/inst/extdata/OSD/H/HELDT.json +++ b/inst/extdata/OSD/H/HELDT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HELMER.json b/inst/extdata/OSD/H/HELMER.json index 2d75fc53ab..1339b43d98 100644 --- a/inst/extdata/OSD/H/HELMER.json +++ b/inst/extdata/OSD/H/HELMER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HENDRICKS.json b/inst/extdata/OSD/H/HENDRICKS.json index a1821a6f61..22e83f02a8 100644 --- a/inst/extdata/OSD/H/HENDRICKS.json +++ b/inst/extdata/OSD/H/HENDRICKS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HENRYSFORK.json b/inst/extdata/OSD/H/HENRYSFORK.json index e9ee0479bd..df44075cfc 100644 --- a/inst/extdata/OSD/H/HENRYSFORK.json +++ b/inst/extdata/OSD/H/HENRYSFORK.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "somewhat poorly to moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/H/HEREFORD.json b/inst/extdata/OSD/H/HEREFORD.json index 28d0d36ab1..0ac6dcaebd 100644 --- a/inst/extdata/OSD/H/HEREFORD.json +++ b/inst/extdata/OSD/H/HEREFORD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HERKIMER.json b/inst/extdata/OSD/H/HERKIMER.json index 78755951cd..2be87b10f2 100644 --- a/inst/extdata/OSD/H/HERKIMER.json +++ b/inst/extdata/OSD/H/HERKIMER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HERMISTON.json b/inst/extdata/OSD/H/HERMISTON.json index 5ee9b37f65..87d1550766 100644 --- a/inst/extdata/OSD/H/HERMISTON.json +++ b/inst/extdata/OSD/H/HERMISTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HERNANDEZ.json b/inst/extdata/OSD/H/HERNANDEZ.json index 7cbea2a06d..1af85f165e 100644 --- a/inst/extdata/OSD/H/HERNANDEZ.json +++ b/inst/extdata/OSD/H/HERNANDEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HERRING_CREEK.json b/inst/extdata/OSD/H/HERRING_CREEK.json index 83576a89ef..a49311d911 100644 --- a/inst/extdata/OSD/H/HERRING_CREEK.json +++ b/inst/extdata/OSD/H/HERRING_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/H/HESPERUS.json b/inst/extdata/OSD/H/HESPERUS.json index f955901af0..caaebc5709 100644 --- a/inst/extdata/OSD/H/HESPERUS.json +++ b/inst/extdata/OSD/H/HESPERUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HESSEL.json b/inst/extdata/OSD/H/HESSEL.json index 673f63abfb..7ab51d25c9 100644 --- a/inst/extdata/OSD/H/HESSEL.json +++ b/inst/extdata/OSD/H/HESSEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HETTINGER.json b/inst/extdata/OSD/H/HETTINGER.json index 47e86b4b81..447857b2c5 100644 --- a/inst/extdata/OSD/H/HETTINGER.json +++ b/inst/extdata/OSD/H/HETTINGER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HETZ.json b/inst/extdata/OSD/H/HETZ.json index 732f3295e2..d441f376ac 100644 --- a/inst/extdata/OSD/H/HETZ.json +++ b/inst/extdata/OSD/H/HETZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/H/HIBSAW.json b/inst/extdata/OSD/H/HIBSAW.json index 550a9c8ada..ba53dc9e50 100644 --- a/inst/extdata/OSD/H/HIBSAW.json +++ b/inst/extdata/OSD/H/HIBSAW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/H/HICO.json b/inst/extdata/OSD/H/HICO.json index 64c2cf36d7..9f74c57787 100644 --- a/inst/extdata/OSD/H/HICO.json +++ b/inst/extdata/OSD/H/HICO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HICORIA.json b/inst/extdata/OSD/H/HICORIA.json index 64be5998fe..371aa0b37e 100644 --- a/inst/extdata/OSD/H/HICORIA.json +++ b/inst/extdata/OSD/H/HICORIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HIDALGO.json b/inst/extdata/OSD/H/HIDALGO.json index 2d403efd98..e3b9d98824 100644 --- a/inst/extdata/OSD/H/HIDALGO.json +++ b/inst/extdata/OSD/H/HIDALGO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HIGHAMS.json b/inst/extdata/OSD/H/HIGHAMS.json index 2205eecbb4..fa15da8afe 100644 --- a/inst/extdata/OSD/H/HIGHAMS.json +++ b/inst/extdata/OSD/H/HIGHAMS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HIGHOAKS.json b/inst/extdata/OSD/H/HIGHOAKS.json index 8132aa235e..a7672ee708 100644 --- a/inst/extdata/OSD/H/HIGHOAKS.json +++ b/inst/extdata/OSD/H/HIGHOAKS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HIGHPOINT.json b/inst/extdata/OSD/H/HIGHPOINT.json index 30c8fb3f84..a89648192b 100644 --- a/inst/extdata/OSD/H/HIGHPOINT.json +++ b/inst/extdata/OSD/H/HIGHPOINT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HIKO_SPRINGS.json b/inst/extdata/OSD/H/HIKO_SPRINGS.json index 23fa7050d9..b22211cf1c 100644 --- a/inst/extdata/OSD/H/HIKO_SPRINGS.json +++ b/inst/extdata/OSD/H/HIKO_SPRINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HILGRAVE.json b/inst/extdata/OSD/H/HILGRAVE.json index 06428e8061..fd066c1e94 100644 --- a/inst/extdata/OSD/H/HILGRAVE.json +++ b/inst/extdata/OSD/H/HILGRAVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HILLERY.json b/inst/extdata/OSD/H/HILLERY.json index 0fd4f0d4d4..bd4dfe8ef9 100644 --- a/inst/extdata/OSD/H/HILLERY.json +++ b/inst/extdata/OSD/H/HILLERY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HILLET.json b/inst/extdata/OSD/H/HILLET.json index 9e2446aef2..95cda79b34 100644 --- a/inst/extdata/OSD/H/HILLET.json +++ b/inst/extdata/OSD/H/HILLET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", + "drainage": "poorly, very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HILLFIELD.json b/inst/extdata/OSD/H/HILLFIELD.json index 3bfbebaf3f..234607f962 100644 --- a/inst/extdata/OSD/H/HILLFIELD.json +++ b/inst/extdata/OSD/H/HILLFIELD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HILLGATE.json b/inst/extdata/OSD/H/HILLGATE.json index dc82a99c98..348921e68f 100644 --- a/inst/extdata/OSD/H/HILLGATE.json +++ b/inst/extdata/OSD/H/HILLGATE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HILLSMERE.json b/inst/extdata/OSD/H/HILLSMERE.json index 365380992a..9b12a188ec 100644 --- a/inst/extdata/OSD/H/HILLSMERE.json +++ b/inst/extdata/OSD/H/HILLSMERE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/H/HILMAR.json b/inst/extdata/OSD/H/HILMAR.json index 64eac9a6ca..b730d74892 100644 --- a/inst/extdata/OSD/H/HILMAR.json +++ b/inst/extdata/OSD/H/HILMAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HILMOE.json b/inst/extdata/OSD/H/HILMOE.json index 8102282f27..4f12312552 100644 --- a/inst/extdata/OSD/H/HILMOE.json +++ b/inst/extdata/OSD/H/HILMOE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HISLE.json b/inst/extdata/OSD/H/HISLE.json index 73c4ccb558..c9b03b5d43 100644 --- a/inst/extdata/OSD/H/HISLE.json +++ b/inst/extdata/OSD/H/HISLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HOADLY.json b/inst/extdata/OSD/H/HOADLY.json index 98e5cad3ca..90b578f776 100644 --- a/inst/extdata/OSD/H/HOADLY.json +++ b/inst/extdata/OSD/H/HOADLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOBACKER.json b/inst/extdata/OSD/H/HOBACKER.json index c16db3a7a0..0d1013a605 100644 --- a/inst/extdata/OSD/H/HOBACKER.json +++ b/inst/extdata/OSD/H/HOBACKER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOBBS.json b/inst/extdata/OSD/H/HOBBS.json index 3c095fc744..f103d416b5 100644 --- a/inst/extdata/OSD/H/HOBBS.json +++ b/inst/extdata/OSD/H/HOBBS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOBOG.json b/inst/extdata/OSD/H/HOBOG.json index 3351f34055..944fca1f7c 100644 --- a/inst/extdata/OSD/H/HOBOG.json +++ b/inst/extdata/OSD/H/HOBOG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOECKERS.json b/inst/extdata/OSD/H/HOECKERS.json index 6edb320b01..2cd17cfdf5 100644 --- a/inst/extdata/OSD/H/HOECKERS.json +++ b/inst/extdata/OSD/H/HOECKERS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/H/HOFFLAND.json b/inst/extdata/OSD/H/HOFFLAND.json index 25e7301278..1e0c380b38 100644 --- a/inst/extdata/OSD/H/HOFFLAND.json +++ b/inst/extdata/OSD/H/HOFFLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOFFMANVILLE.json b/inst/extdata/OSD/H/HOFFMANVILLE.json index a45ec64fec..85e2208487 100644 --- a/inst/extdata/OSD/H/HOFFMANVILLE.json +++ b/inst/extdata/OSD/H/HOFFMANVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOGG.json b/inst/extdata/OSD/H/HOGG.json index b5cfc2033e..f5cf042814 100644 --- a/inst/extdata/OSD/H/HOGG.json +++ b/inst/extdata/OSD/H/HOGG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HOGPEN.json b/inst/extdata/OSD/H/HOGPEN.json index fe0d8c64e8..2c0a8c8fbe 100644 --- a/inst/extdata/OSD/H/HOGPEN.json +++ b/inst/extdata/OSD/H/HOGPEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively or well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOH.json b/inst/extdata/OSD/H/HOH.json index 59c58a51cd..d99b3757ac 100644 --- a/inst/extdata/OSD/H/HOH.json +++ b/inst/extdata/OSD/H/HOH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HOLLIS.json b/inst/extdata/OSD/H/HOLLIS.json index 7a02211574..f68bf76d5b 100644 --- a/inst/extdata/OSD/H/HOLLIS.json +++ b/inst/extdata/OSD/H/HOLLIS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HOLLY.json b/inst/extdata/OSD/H/HOLLY.json index 0ada93eaae..55199e70cb 100644 --- a/inst/extdata/OSD/H/HOLLY.json +++ b/inst/extdata/OSD/H/HOLLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOLMDEL.json b/inst/extdata/OSD/H/HOLMDEL.json index 3c3b3ca1f0..8ed053817d 100644 --- a/inst/extdata/OSD/H/HOLMDEL.json +++ b/inst/extdata/OSD/H/HOLMDEL.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOLOKUKFAMILY.json b/inst/extdata/OSD/H/HOLOKUKFAMILY.json index 53ff417127..410fb3cbfe 100644 --- a/inst/extdata/OSD/H/HOLOKUKFAMILY.json +++ b/inst/extdata/OSD/H/HOLOKUKFAMILY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HOLOPAW.json b/inst/extdata/OSD/H/HOLOPAW.json index fc908f8fa8..1c43346ac3 100644 --- a/inst/extdata/OSD/H/HOLOPAW.json +++ b/inst/extdata/OSD/H/HOLOPAW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOLSINE.json b/inst/extdata/OSD/H/HOLSINE.json index 7db0a37a69..8c5d25eacb 100644 --- a/inst/extdata/OSD/H/HOLSINE.json +++ b/inst/extdata/OSD/H/HOLSINE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOLTLE.json b/inst/extdata/OSD/H/HOLTLE.json index 3d0eb90479..7a99fcd298 100644 --- a/inst/extdata/OSD/H/HOLTLE.json +++ b/inst/extdata/OSD/H/HOLTLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOLYOKE.json b/inst/extdata/OSD/H/HOLYOKE.json index 35df1945e3..463f80c53f 100644 --- a/inst/extdata/OSD/H/HOLYOKE.json +++ b/inst/extdata/OSD/H/HOLYOKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HOMESTAKE.json b/inst/extdata/OSD/H/HOMESTAKE.json index 89503ceba9..15fcdea9e5 100644 --- a/inst/extdata/OSD/H/HOMESTAKE.json +++ b/inst/extdata/OSD/H/HOMESTAKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOMME.json b/inst/extdata/OSD/H/HOMME.json index 83d2e70f77..108086a787 100644 --- a/inst/extdata/OSD/H/HOMME.json +++ b/inst/extdata/OSD/H/HOMME.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HONDALE.json b/inst/extdata/OSD/H/HONDALE.json index 1f74feeea5..7cbef7cd9d 100644 --- a/inst/extdata/OSD/H/HONDALE.json +++ b/inst/extdata/OSD/H/HONDALE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HOOD.json b/inst/extdata/OSD/H/HOOD.json index 67fe8ac9f5..8c8aac3b10 100644 --- a/inst/extdata/OSD/H/HOOD.json +++ b/inst/extdata/OSD/H/HOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOOPER.json b/inst/extdata/OSD/H/HOOPER.json index 86c47f24ff..c4a30d2e8a 100644 --- a/inst/extdata/OSD/H/HOOPER.json +++ b/inst/extdata/OSD/H/HOOPER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HOPEVAL.json b/inst/extdata/OSD/H/HOPEVAL.json index e40aebc17b..1ca448b0b9 100644 --- a/inst/extdata/OSD/H/HOPEVAL.json +++ b/inst/extdata/OSD/H/HOPEVAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HOPKINS.json b/inst/extdata/OSD/H/HOPKINS.json index 7dc23ff62b..aa0bc81d51 100644 --- a/inst/extdata/OSD/H/HOPKINS.json +++ b/inst/extdata/OSD/H/HOPKINS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HOPLEY.json b/inst/extdata/OSD/H/HOPLEY.json index 9eb4ca9d6f..f126369585 100644 --- a/inst/extdata/OSD/H/HOPLEY.json +++ b/inst/extdata/OSD/H/HOPLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HORNITOS.json b/inst/extdata/OSD/H/HORNITOS.json index 4a14549141..139f9a0fab 100644 --- a/inst/extdata/OSD/H/HORNITOS.json +++ b/inst/extdata/OSD/H/HORNITOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively to well", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HORROCKS.json b/inst/extdata/OSD/H/HORROCKS.json index 1c5432abfe..7681f33f41 100644 --- a/inst/extdata/OSD/H/HORROCKS.json +++ b/inst/extdata/OSD/H/HORROCKS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HOSKIN.json b/inst/extdata/OSD/H/HOSKIN.json index b992b4c2bc..da40663b11 100644 --- a/inst/extdata/OSD/H/HOSKIN.json +++ b/inst/extdata/OSD/H/HOSKIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HOSSICK.json b/inst/extdata/OSD/H/HOSSICK.json index 9ff153f1d0..af0aff168f 100644 --- a/inst/extdata/OSD/H/HOSSICK.json +++ b/inst/extdata/OSD/H/HOSSICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HOUSTON_BLACK.json b/inst/extdata/OSD/H/HOUSTON_BLACK.json index 7c1e3c34cd..71f7750054 100644 --- a/inst/extdata/OSD/H/HOUSTON_BLACK.json +++ b/inst/extdata/OSD/H/HOUSTON_BLACK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HOWARD.json b/inst/extdata/OSD/H/HOWARD.json index 84cceb9d83..0abe1e5628 100644 --- a/inst/extdata/OSD/H/HOWARD.json +++ b/inst/extdata/OSD/H/HOWARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HUB.json b/inst/extdata/OSD/H/HUB.json index 4fa107b168..ed260559da 100644 --- a/inst/extdata/OSD/H/HUB.json +++ b/inst/extdata/OSD/H/HUB.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HUBBARD.json b/inst/extdata/OSD/H/HUBBARD.json index cc85124a81..19ce834eb7 100644 --- a/inst/extdata/OSD/H/HUBBARD.json +++ b/inst/extdata/OSD/H/HUBBARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively", - "drainage_overview": "excessively and well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/H/HUBTALF.json b/inst/extdata/OSD/H/HUBTALF.json index ea625394ad..48866cf3f7 100644 --- a/inst/extdata/OSD/H/HUBTALF.json +++ b/inst/extdata/OSD/H/HUBTALF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/H/HUERHUERO.json b/inst/extdata/OSD/H/HUERHUERO.json index 74454056a8..b72da95ee5 100644 --- a/inst/extdata/OSD/H/HUERHUERO.json +++ b/inst/extdata/OSD/H/HUERHUERO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HUFFINE.json b/inst/extdata/OSD/H/HUFFINE.json index 36c2f0cbbf..9baa25e7f4 100644 --- a/inst/extdata/OSD/H/HUFFINE.json +++ b/inst/extdata/OSD/H/HUFFINE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HULLIGAN.json b/inst/extdata/OSD/H/HULLIGAN.json index 6cd623fe36..1bb66218f2 100644 --- a/inst/extdata/OSD/H/HULLIGAN.json +++ b/inst/extdata/OSD/H/HULLIGAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HULLS.json b/inst/extdata/OSD/H/HULLS.json index 6209b86175..29fcae17fc 100644 --- a/inst/extdata/OSD/H/HULLS.json +++ b/inst/extdata/OSD/H/HULLS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HUMBARGER.json b/inst/extdata/OSD/H/HUMBARGER.json index f16999eba2..0617cf8949 100644 --- a/inst/extdata/OSD/H/HUMBARGER.json +++ b/inst/extdata/OSD/H/HUMBARGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HUMBARSPRINGS.json b/inst/extdata/OSD/H/HUMBARSPRINGS.json index 9f6b9f3639..6ae731bac2 100644 --- a/inst/extdata/OSD/H/HUMBARSPRINGS.json +++ b/inst/extdata/OSD/H/HUMBARSPRINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HUN.json b/inst/extdata/OSD/H/HUN.json index 69d9d94c8f..8bfccbdaa9 100644 --- a/inst/extdata/OSD/H/HUN.json +++ b/inst/extdata/OSD/H/HUN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HUNTIMER.json b/inst/extdata/OSD/H/HUNTIMER.json index 879b06102f..3a8a3856ec 100644 --- a/inst/extdata/OSD/H/HUNTIMER.json +++ b/inst/extdata/OSD/H/HUNTIMER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HUPP.json b/inst/extdata/OSD/H/HUPP.json index 11cc420874..1ea44b826f 100644 --- a/inst/extdata/OSD/H/HUPP.json +++ b/inst/extdata/OSD/H/HUPP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HURLEY.json b/inst/extdata/OSD/H/HURLEY.json index c07c8e79be..88f887d7ee 100644 --- a/inst/extdata/OSD/H/HURLEY.json +++ b/inst/extdata/OSD/H/HURLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/H/HUSCHER.json b/inst/extdata/OSD/H/HUSCHER.json index 223922f615..ca20e0e40e 100644 --- a/inst/extdata/OSD/H/HUSCHER.json +++ b/inst/extdata/OSD/H/HUSCHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HUSE.json b/inst/extdata/OSD/H/HUSE.json index 6923d32181..68cb66ed02 100644 --- a/inst/extdata/OSD/H/HUSE.json +++ b/inst/extdata/OSD/H/HUSE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HUSKA.json b/inst/extdata/OSD/H/HUSKA.json index aa2e2e0c67..673bc6bc29 100644 --- a/inst/extdata/OSD/H/HUSKA.json +++ b/inst/extdata/OSD/H/HUSKA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/H/HUSSA.json b/inst/extdata/OSD/H/HUSSA.json index 7c74006d62..7419e1a1e7 100644 --- a/inst/extdata/OSD/H/HUSSA.json +++ b/inst/extdata/OSD/H/HUSSA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/H/HUTSON.json b/inst/extdata/OSD/H/HUTSON.json index 402d3c0f2d..3eb4602c5e 100644 --- a/inst/extdata/OSD/H/HUTSON.json +++ b/inst/extdata/OSD/H/HUTSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HYDRO.json b/inst/extdata/OSD/H/HYDRO.json index 5029156849..ff265d30b4 100644 --- a/inst/extdata/OSD/H/HYDRO.json +++ b/inst/extdata/OSD/H/HYDRO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/H/HYER.json b/inst/extdata/OSD/H/HYER.json index f9dbcd5e67..3532d7f272 100644 --- a/inst/extdata/OSD/H/HYER.json +++ b/inst/extdata/OSD/H/HYER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/H/HYSHAM.json b/inst/extdata/OSD/H/HYSHAM.json index 0968f290cf..fbfac6a671 100644 --- a/inst/extdata/OSD/H/HYSHAM.json +++ b/inst/extdata/OSD/H/HYSHAM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/H/HYSOOP.json b/inst/extdata/OSD/H/HYSOOP.json index ef5f063934..921bb237dd 100644 --- a/inst/extdata/OSD/H/HYSOOP.json +++ b/inst/extdata/OSD/H/HYSOOP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/IHOPE.json b/inst/extdata/OSD/I/IHOPE.json index cdb9b04848..74bd565934 100644 --- a/inst/extdata/OSD/I/IHOPE.json +++ b/inst/extdata/OSD/I/IHOPE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/I/ILIFF.json b/inst/extdata/OSD/I/ILIFF.json index a8b73c04f8..11a6562f24 100644 --- a/inst/extdata/OSD/I/ILIFF.json +++ b/inst/extdata/OSD/I/ILIFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/I/IMMOKALEE.json b/inst/extdata/OSD/I/IMMOKALEE.json index a1d398cbd9..a1881d2908 100644 --- a/inst/extdata/OSD/I/IMMOKALEE.json +++ b/inst/extdata/OSD/I/IMMOKALEE.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "very poorly and poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/I/IMPERIAL.json b/inst/extdata/OSD/I/IMPERIAL.json index 604171988e..9589b47589 100644 --- a/inst/extdata/OSD/I/IMPERIAL.json +++ b/inst/extdata/OSD/I/IMPERIAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/I/INDART.json b/inst/extdata/OSD/I/INDART.json index 930cff7952..d8c66a8c56 100644 --- a/inst/extdata/OSD/I/INDART.json +++ b/inst/extdata/OSD/I/INDART.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/INDIAN_RIVER.json b/inst/extdata/OSD/I/INDIAN_RIVER.json index 44a158a1b3..f9293ab0bb 100644 --- a/inst/extdata/OSD/I/INDIAN_RIVER.json +++ b/inst/extdata/OSD/I/INDIAN_RIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/I/INDIO.json b/inst/extdata/OSD/I/INDIO.json index 896bf4d89c..48501cb05a 100644 --- a/inst/extdata/OSD/I/INDIO.json +++ b/inst/extdata/OSD/I/INDIO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/I/INDUS.json b/inst/extdata/OSD/I/INDUS.json index 02a2fa2857..e6902acf18 100644 --- a/inst/extdata/OSD/I/INDUS.json +++ b/inst/extdata/OSD/I/INDUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/I/INEZ.json b/inst/extdata/OSD/I/INEZ.json index 9c9e7506eb..b944d142ce 100644 --- a/inst/extdata/OSD/I/INEZ.json +++ b/inst/extdata/OSD/I/INEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/I/INGLEWOOD.json b/inst/extdata/OSD/I/INGLEWOOD.json index 1c766dc9b4..d25a352a8c 100644 --- a/inst/extdata/OSD/I/INGLEWOOD.json +++ b/inst/extdata/OSD/I/INGLEWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/I/INKSTER.json b/inst/extdata/OSD/I/INKSTER.json index f875daa05a..7fb0557e55 100644 --- a/inst/extdata/OSD/I/INKSTER.json +++ b/inst/extdata/OSD/I/INKSTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/I/IPHIL.json b/inst/extdata/OSD/I/IPHIL.json index eb8fe030d8..9a739f5f7d 100644 --- a/inst/extdata/OSD/I/IPHIL.json +++ b/inst/extdata/OSD/I/IPHIL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/IRAK.json b/inst/extdata/OSD/I/IRAK.json index af15c03979..0edc4c7cfc 100644 --- a/inst/extdata/OSD/I/IRAK.json +++ b/inst/extdata/OSD/I/IRAK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/I/IRION.json b/inst/extdata/OSD/I/IRION.json index f520121ae4..5008c778fe 100644 --- a/inst/extdata/OSD/I/IRION.json +++ b/inst/extdata/OSD/I/IRION.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/IROCK.json b/inst/extdata/OSD/I/IROCK.json index 1ffc82677d..9b8688449c 100644 --- a/inst/extdata/OSD/I/IROCK.json +++ b/inst/extdata/OSD/I/IROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/I/IRONAGE.json b/inst/extdata/OSD/I/IRONAGE.json index 2f9d61f7bf..5ffee8b238 100644 --- a/inst/extdata/OSD/I/IRONAGE.json +++ b/inst/extdata/OSD/I/IRONAGE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/IRON_MOUNTAIN.json b/inst/extdata/OSD/I/IRON_MOUNTAIN.json index 60ad214ea3..a3c3372a3d 100644 --- a/inst/extdata/OSD/I/IRON_MOUNTAIN.json +++ b/inst/extdata/OSD/I/IRON_MOUNTAIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/I/IRWIN.json b/inst/extdata/OSD/I/IRWIN.json index 87cd59d5b0..cad14ba026 100644 --- a/inst/extdata/OSD/I/IRWIN.json +++ b/inst/extdata/OSD/I/IRWIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/I/ISABELLA.json b/inst/extdata/OSD/I/ISABELLA.json index 191f7af4ff..9d8a4dc956 100644 --- a/inst/extdata/OSD/I/ISABELLA.json +++ b/inst/extdata/OSD/I/ISABELLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/ISAN.json b/inst/extdata/OSD/I/ISAN.json index b1b5215277..33018b73af 100644 --- a/inst/extdata/OSD/I/ISAN.json +++ b/inst/extdata/OSD/I/ISAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/I/ISANTI.json b/inst/extdata/OSD/I/ISANTI.json index 54366d2ac6..0c90c37cee 100644 --- a/inst/extdata/OSD/I/ISANTI.json +++ b/inst/extdata/OSD/I/ISANTI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/I/ISLES.json b/inst/extdata/OSD/I/ISLES.json index 64530db6e6..3a5fa91185 100644 --- a/inst/extdata/OSD/I/ISLES.json +++ b/inst/extdata/OSD/I/ISLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/I/ISMAILOF.json b/inst/extdata/OSD/I/ISMAILOF.json index 5a81f2d4dd..c50e177b45 100644 --- a/inst/extdata/OSD/I/ISMAILOF.json +++ b/inst/extdata/OSD/I/ISMAILOF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "moderately well and well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/I/ISOM.json b/inst/extdata/OSD/I/ISOM.json index db9c6effe2..1a6e92b4e2 100644 --- a/inst/extdata/OSD/I/ISOM.json +++ b/inst/extdata/OSD/I/ISOM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/I/ITTSANAPPER.json b/inst/extdata/OSD/I/ITTSANAPPER.json index c599269503..2ebe435c45 100644 --- a/inst/extdata/OSD/I/ITTSANAPPER.json +++ b/inst/extdata/OSD/I/ITTSANAPPER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/I/IVAN.json b/inst/extdata/OSD/I/IVAN.json index 1da73e2f4b..7f061eb0be 100644 --- a/inst/extdata/OSD/I/IVAN.json +++ b/inst/extdata/OSD/I/IVAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JABU.json b/inst/extdata/OSD/J/JABU.json index eec3f6e391..ec26b4f372 100644 --- a/inst/extdata/OSD/J/JABU.json +++ b/inst/extdata/OSD/J/JABU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JACAGUAS.json b/inst/extdata/OSD/J/JACAGUAS.json index f9c9f29d9f..e1bd0575bf 100644 --- a/inst/extdata/OSD/J/JACAGUAS.json +++ b/inst/extdata/OSD/J/JACAGUAS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well to excessively" + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/J/JACKALOPE.json b/inst/extdata/OSD/J/JACKALOPE.json index 835528b73b..1b8647b2fe 100644 --- a/inst/extdata/OSD/J/JACKALOPE.json +++ b/inst/extdata/OSD/J/JACKALOPE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JACKLAND.json b/inst/extdata/OSD/J/JACKLAND.json index 1620a36af1..be92b4de0f 100644 --- a/inst/extdata/OSD/J/JACKLAND.json +++ b/inst/extdata/OSD/J/JACKLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/J/JACKMILL.json b/inst/extdata/OSD/J/JACKMILL.json index b9d5c715d0..60b1adba3c 100644 --- a/inst/extdata/OSD/J/JACKMILL.json +++ b/inst/extdata/OSD/J/JACKMILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JACOB.json b/inst/extdata/OSD/J/JACOB.json index f098b170dc..fb9d0b6e18 100644 --- a/inst/extdata/OSD/J/JACOB.json +++ b/inst/extdata/OSD/J/JACOB.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/J/JACOBSVILLE.json b/inst/extdata/OSD/J/JACOBSVILLE.json index 3e2a54d33f..e1a2ffee9b 100644 --- a/inst/extdata/OSD/J/JACOBSVILLE.json +++ b/inst/extdata/OSD/J/JACOBSVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/J/JACQUITH.json b/inst/extdata/OSD/J/JACQUITH.json index 9dd2bf6848..79e00be217 100644 --- a/inst/extdata/OSD/J/JACQUITH.json +++ b/inst/extdata/OSD/J/JACQUITH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/J/JAL.json b/inst/extdata/OSD/J/JAL.json index 114c12aaa2..54f29d476e 100644 --- a/inst/extdata/OSD/J/JAL.json +++ b/inst/extdata/OSD/J/JAL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/J/JAMES.json b/inst/extdata/OSD/J/JAMES.json index b363df68f4..3818bbd002 100644 --- a/inst/extdata/OSD/J/JAMES.json +++ b/inst/extdata/OSD/J/JAMES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/J/JARBOE.json b/inst/extdata/OSD/J/JARBOE.json index 081248de5a..cb7ddc8a8d 100644 --- a/inst/extdata/OSD/J/JARBOE.json +++ b/inst/extdata/OSD/J/JARBOE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/J/JARDAL.json b/inst/extdata/OSD/J/JARDAL.json index 19c20c23be..826d498d04 100644 --- a/inst/extdata/OSD/J/JARDAL.json +++ b/inst/extdata/OSD/J/JARDAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JARITA.json b/inst/extdata/OSD/J/JARITA.json index 3e9e5e2691..bde944be28 100644 --- a/inst/extdata/OSD/J/JARITA.json +++ b/inst/extdata/OSD/J/JARITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/J/JAYEM.json b/inst/extdata/OSD/J/JAYEM.json index 756ca57222..06e58136d1 100644 --- a/inst/extdata/OSD/J/JAYEM.json +++ b/inst/extdata/OSD/J/JAYEM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/J/JEDDO.json b/inst/extdata/OSD/J/JEDDO.json index 4249f3efdd..70e74cb186 100644 --- a/inst/extdata/OSD/J/JEDDO.json +++ b/inst/extdata/OSD/J/JEDDO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/J/JEDEDIAH.json b/inst/extdata/OSD/J/JEDEDIAH.json index a7ad11a47e..699613cc9e 100644 --- a/inst/extdata/OSD/J/JEDEDIAH.json +++ b/inst/extdata/OSD/J/JEDEDIAH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JEFFERSON.json b/inst/extdata/OSD/J/JEFFERSON.json index 9ebadb3200..a708988173 100644 --- a/inst/extdata/OSD/J/JEFFERSON.json +++ b/inst/extdata/OSD/J/JEFFERSON.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/J/JENADA.json b/inst/extdata/OSD/J/JENADA.json index 3ddd7abb0f..5688a914a1 100644 --- a/inst/extdata/OSD/J/JENADA.json +++ b/inst/extdata/OSD/J/JENADA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/J/JENNESS.json b/inst/extdata/OSD/J/JENNESS.json index 1883914b25..84244e828a 100644 --- a/inst/extdata/OSD/J/JENNESS.json +++ b/inst/extdata/OSD/J/JENNESS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JERAG.json b/inst/extdata/OSD/J/JERAG.json index e33a839892..b049792a4a 100644 --- a/inst/extdata/OSD/J/JERAG.json +++ b/inst/extdata/OSD/J/JERAG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JERAULD.json b/inst/extdata/OSD/J/JERAULD.json index 7ddb9b91c3..3925d51f58 100644 --- a/inst/extdata/OSD/J/JERAULD.json +++ b/inst/extdata/OSD/J/JERAULD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/J/JERU.json b/inst/extdata/OSD/J/JERU.json index f0e9f7198c..31daecc6b4 100644 --- a/inst/extdata/OSD/J/JERU.json +++ b/inst/extdata/OSD/J/JERU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JICARILLA.json b/inst/extdata/OSD/J/JICARILLA.json index 34e24cc2b4..19e88adb0a 100644 --- a/inst/extdata/OSD/J/JICARILLA.json +++ b/inst/extdata/OSD/J/JICARILLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/J/JIGGS.json b/inst/extdata/OSD/J/JIGGS.json index 8926113833..6bc9c574bd 100644 --- a/inst/extdata/OSD/J/JIGGS.json +++ b/inst/extdata/OSD/J/JIGGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/J/JIPPER.json b/inst/extdata/OSD/J/JIPPER.json index 4104fa035a..a1f15eb38e 100644 --- a/inst/extdata/OSD/J/JIPPER.json +++ b/inst/extdata/OSD/J/JIPPER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JODERO.json b/inst/extdata/OSD/J/JODERO.json index 7246968497..9160511c08 100644 --- a/inst/extdata/OSD/J/JODERO.json +++ b/inst/extdata/OSD/J/JODERO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JOECUT.json b/inst/extdata/OSD/J/JOECUT.json index 77f5f52111..324b2cdbad 100644 --- a/inst/extdata/OSD/J/JOECUT.json +++ b/inst/extdata/OSD/J/JOECUT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/J/JONATHAN.json b/inst/extdata/OSD/J/JONATHAN.json index 93cacd5086..dbf8ba9e0f 100644 --- a/inst/extdata/OSD/J/JONATHAN.json +++ b/inst/extdata/OSD/J/JONATHAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat excessively", - "drainage_overview": "moderately well to somewhat excessively" + "drainage": "somewhat excessively, well, moderately well", + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/J/JONESBAY.json b/inst/extdata/OSD/J/JONESBAY.json index d35c703a07..9f8d061d92 100644 --- a/inst/extdata/OSD/J/JONESBAY.json +++ b/inst/extdata/OSD/J/JONESBAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/J/JUBILEE.json b/inst/extdata/OSD/J/JUBILEE.json index d495a0078d..f305423401 100644 --- a/inst/extdata/OSD/J/JUBILEE.json +++ b/inst/extdata/OSD/J/JUBILEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/J/JUDY.json b/inst/extdata/OSD/J/JUDY.json index 5381527370..406ad5d7bf 100644 --- a/inst/extdata/OSD/J/JUDY.json +++ b/inst/extdata/OSD/J/JUDY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JULES.json b/inst/extdata/OSD/J/JULES.json index 1f92374ca6..9a3d0bb731 100644 --- a/inst/extdata/OSD/J/JULES.json +++ b/inst/extdata/OSD/J/JULES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/J/JUNCTION.json b/inst/extdata/OSD/J/JUNCTION.json index 43c5b8f1bd..cd145b0061 100644 --- a/inst/extdata/OSD/J/JUNCTION.json +++ b/inst/extdata/OSD/J/JUNCTION.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/J/JUPITER.json b/inst/extdata/OSD/J/JUPITER.json index 8bdfaffe9e..44e6ba37bc 100644 --- a/inst/extdata/OSD/J/JUPITER.json +++ b/inst/extdata/OSD/J/JUPITER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KACHEMAK.json b/inst/extdata/OSD/K/KACHEMAK.json index aea9fef932..e96e25de48 100644 --- a/inst/extdata/OSD/K/KACHEMAK.json +++ b/inst/extdata/OSD/K/KACHEMAK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KAHNEETA.json b/inst/extdata/OSD/K/KAHNEETA.json index 8279ea9264..32182b3b19 100644 --- a/inst/extdata/OSD/K/KAHNEETA.json +++ b/inst/extdata/OSD/K/KAHNEETA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/K/KALMARVILLE.json b/inst/extdata/OSD/K/KALMARVILLE.json index d1c354fd43..a165d513e1 100644 --- a/inst/extdata/OSD/K/KALMARVILLE.json +++ b/inst/extdata/OSD/K/KALMARVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KAMACK.json b/inst/extdata/OSD/K/KAMACK.json index a892b744c8..0b30ad56d8 100644 --- a/inst/extdata/OSD/K/KAMACK.json +++ b/inst/extdata/OSD/K/KAMACK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KANIKSU.json b/inst/extdata/OSD/K/KANIKSU.json index fd66a27c04..ef3bce35e7 100644 --- a/inst/extdata/OSD/K/KANIKSU.json +++ b/inst/extdata/OSD/K/KANIKSU.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KANLEE.json b/inst/extdata/OSD/K/KANLEE.json index 8f5e09e0ed..084253af6f 100644 --- a/inst/extdata/OSD/K/KANLEE.json +++ b/inst/extdata/OSD/K/KANLEE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well to somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KANZA.json b/inst/extdata/OSD/K/KANZA.json index 0769865d86..260823d4a1 100644 --- a/inst/extdata/OSD/K/KANZA.json +++ b/inst/extdata/OSD/K/KANZA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/K/KARRO.json b/inst/extdata/OSD/K/KARRO.json index f21aa5924c..9dd6513894 100644 --- a/inst/extdata/OSD/K/KARRO.json +++ b/inst/extdata/OSD/K/KARRO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KARS.json b/inst/extdata/OSD/K/KARS.json index 47952034c5..bfa71ac2ff 100644 --- a/inst/extdata/OSD/K/KARS.json +++ b/inst/extdata/OSD/K/KARS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KARTA.json b/inst/extdata/OSD/K/KARTA.json index 196217936f..83ed413a83 100644 --- a/inst/extdata/OSD/K/KARTA.json +++ b/inst/extdata/OSD/K/KARTA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KATHER.json b/inst/extdata/OSD/K/KATHER.json index 0c03d74188..bbefa64fc7 100644 --- a/inst/extdata/OSD/K/KATHER.json +++ b/inst/extdata/OSD/K/KATHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KATO.json b/inst/extdata/OSD/K/KATO.json index de6fd4591c..44fd6aa4b3 100644 --- a/inst/extdata/OSD/K/KATO.json +++ b/inst/extdata/OSD/K/KATO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KATY.json b/inst/extdata/OSD/K/KATY.json index 92142eee1d..33146bdf04 100644 --- a/inst/extdata/OSD/K/KATY.json +++ b/inst/extdata/OSD/K/KATY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/K/KAUDER.json b/inst/extdata/OSD/K/KAUDER.json index 1dfa3e3d0e..06048a313e 100644 --- a/inst/extdata/OSD/K/KAUDER.json +++ b/inst/extdata/OSD/K/KAUDER.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KAYO.json b/inst/extdata/OSD/K/KAYO.json index d724707ee3..a7119498e6 100644 --- a/inst/extdata/OSD/K/KAYO.json +++ b/inst/extdata/OSD/K/KAYO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KEDRON.json b/inst/extdata/OSD/K/KEDRON.json index 87272553a8..d3248b6be9 100644 --- a/inst/extdata/OSD/K/KEDRON.json +++ b/inst/extdata/OSD/K/KEDRON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/K/KEELDAR.json b/inst/extdata/OSD/K/KEELDAR.json index 22054864b3..8205a3d70b 100644 --- a/inst/extdata/OSD/K/KEELDAR.json +++ b/inst/extdata/OSD/K/KEELDAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KEELINE.json b/inst/extdata/OSD/K/KEELINE.json index 302cfcd22f..f4fd415d60 100644 --- a/inst/extdata/OSD/K/KEELINE.json +++ b/inst/extdata/OSD/K/KEELINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KEETER.json b/inst/extdata/OSD/K/KEETER.json index 3b7d952a60..c49b406447 100644 --- a/inst/extdata/OSD/K/KEETER.json +++ b/inst/extdata/OSD/K/KEETER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KEMMERER.json b/inst/extdata/OSD/K/KEMMERER.json index b85475b0ed..6e9d0e0cda 100644 --- a/inst/extdata/OSD/K/KEMMERER.json +++ b/inst/extdata/OSD/K/KEMMERER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KENAI.json b/inst/extdata/OSD/K/KENAI.json index 6b15a25f75..896d44d986 100644 --- a/inst/extdata/OSD/K/KENAI.json +++ b/inst/extdata/OSD/K/KENAI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KENALDUMA.json b/inst/extdata/OSD/K/KENALDUMA.json index c56a4aeb21..4dc965d188 100644 --- a/inst/extdata/OSD/K/KENALDUMA.json +++ b/inst/extdata/OSD/K/KENALDUMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KENNER.json b/inst/extdata/OSD/K/KENNER.json index dd17bd3d73..06d675f06c 100644 --- a/inst/extdata/OSD/K/KENNER.json +++ b/inst/extdata/OSD/K/KENNER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/K/KENSPUR.json b/inst/extdata/OSD/K/KENSPUR.json index dde26b46ed..e6e750506a 100644 --- a/inst/extdata/OSD/K/KENSPUR.json +++ b/inst/extdata/OSD/K/KENSPUR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/K/KERBER.json b/inst/extdata/OSD/K/KERBER.json index cc13da64e3..de87cb3287 100644 --- a/inst/extdata/OSD/K/KERBER.json +++ b/inst/extdata/OSD/K/KERBER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/K/KERSICK.json b/inst/extdata/OSD/K/KERSICK.json index fcd1fd7570..9e668d67d3 100644 --- a/inst/extdata/OSD/K/KERSICK.json +++ b/inst/extdata/OSD/K/KERSICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KESSLER.json b/inst/extdata/OSD/K/KESSLER.json index 229865e37f..9f44d8cb36 100644 --- a/inst/extdata/OSD/K/KESSLER.json +++ b/inst/extdata/OSD/K/KESSLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KESTNER.json b/inst/extdata/OSD/K/KESTNER.json index 4d8da1acca..0f54cae795 100644 --- a/inst/extdata/OSD/K/KESTNER.json +++ b/inst/extdata/OSD/K/KESTNER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/K/KETTLE.json b/inst/extdata/OSD/K/KETTLE.json index 864ed5acca..f7f0ecb2fc 100644 --- a/inst/extdata/OSD/K/KETTLE.json +++ b/inst/extdata/OSD/K/KETTLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KETTNER.json b/inst/extdata/OSD/K/KETTNER.json index 6d29a8aefd..b9133631f2 100644 --- a/inst/extdata/OSD/K/KETTNER.json +++ b/inst/extdata/OSD/K/KETTNER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KEYA.json b/inst/extdata/OSD/K/KEYA.json index 5eee18c103..d7d6b34c4a 100644 --- a/inst/extdata/OSD/K/KEYA.json +++ b/inst/extdata/OSD/K/KEYA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KEYES.json b/inst/extdata/OSD/K/KEYES.json index 21f4e8b888..244c605994 100644 --- a/inst/extdata/OSD/K/KEYES.json +++ b/inst/extdata/OSD/K/KEYES.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KIDAZQENI.json b/inst/extdata/OSD/K/KIDAZQENI.json index e874c565e4..dc7d1dc810 100644 --- a/inst/extdata/OSD/K/KIDAZQENI.json +++ b/inst/extdata/OSD/K/KIDAZQENI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KIDD.json b/inst/extdata/OSD/K/KIDD.json index 7777c30a2e..6592f39e09 100644 --- a/inst/extdata/OSD/K/KIDD.json +++ b/inst/extdata/OSD/K/KIDD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/K/KIDMAN.json b/inst/extdata/OSD/K/KIDMAN.json index dc08feee74..53aa355c5e 100644 --- a/inst/extdata/OSD/K/KIDMAN.json +++ b/inst/extdata/OSD/K/KIDMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KILCHIS.json b/inst/extdata/OSD/K/KILCHIS.json index 074d92e975..0cefd7eabb 100644 --- a/inst/extdata/OSD/K/KILCHIS.json +++ b/inst/extdata/OSD/K/KILCHIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KILLDUFF.json b/inst/extdata/OSD/K/KILLDUFF.json index 7fda2943da..a52f63ffb9 100644 --- a/inst/extdata/OSD/K/KILLDUFF.json +++ b/inst/extdata/OSD/K/KILLDUFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KIM.json b/inst/extdata/OSD/K/KIM.json index e73cac9254..b4ccfa04cd 100644 --- a/inst/extdata/OSD/K/KIM.json +++ b/inst/extdata/OSD/K/KIM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KINESAVA.json b/inst/extdata/OSD/K/KINESAVA.json index ffe436dbb2..f98cb3906b 100644 --- a/inst/extdata/OSD/K/KINESAVA.json +++ b/inst/extdata/OSD/K/KINESAVA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KINKEAD.json b/inst/extdata/OSD/K/KINKEAD.json index a17eff0369..03db047f29 100644 --- a/inst/extdata/OSD/K/KINKEAD.json +++ b/inst/extdata/OSD/K/KINKEAD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KINROSS.json b/inst/extdata/OSD/K/KINROSS.json index fdda64ef29..141d174259 100644 --- a/inst/extdata/OSD/K/KINROSS.json +++ b/inst/extdata/OSD/K/KINROSS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KINSEYRIDGE.json b/inst/extdata/OSD/K/KINSEYRIDGE.json index 9285680296..785745a485 100644 --- a/inst/extdata/OSD/K/KINSEYRIDGE.json +++ b/inst/extdata/OSD/K/KINSEYRIDGE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KIPER.json b/inst/extdata/OSD/K/KIPER.json index 3768eb1ccc..9a458d32d7 100644 --- a/inst/extdata/OSD/K/KIPER.json +++ b/inst/extdata/OSD/K/KIPER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KIPPEN.json b/inst/extdata/OSD/K/KIPPEN.json index fd860e5c4b..98f9a7f1d9 100644 --- a/inst/extdata/OSD/K/KIPPEN.json +++ b/inst/extdata/OSD/K/KIPPEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KIPSON.json b/inst/extdata/OSD/K/KIPSON.json index 17ccffaca3..7356db5532 100644 --- a/inst/extdata/OSD/K/KIPSON.json +++ b/inst/extdata/OSD/K/KIPSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/K/KIRBYVILLE.json b/inst/extdata/OSD/K/KIRBYVILLE.json index a8d3043ef2..7a46dcbf09 100644 --- a/inst/extdata/OSD/K/KIRBYVILLE.json +++ b/inst/extdata/OSD/K/KIRBYVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/K/KIRKENDALL.json b/inst/extdata/OSD/K/KIRKENDALL.json index f29b2d1d8f..9157d38874 100644 --- a/inst/extdata/OSD/K/KIRKENDALL.json +++ b/inst/extdata/OSD/K/KIRKENDALL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KIRKHAM.json b/inst/extdata/OSD/K/KIRKHAM.json index aa6e5fdf81..7aaa09881e 100644 --- a/inst/extdata/OSD/K/KIRKHAM.json +++ b/inst/extdata/OSD/K/KIRKHAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/K/KIRO.json b/inst/extdata/OSD/K/KIRO.json index dc7260286b..e82bc9c04a 100644 --- a/inst/extdata/OSD/K/KIRO.json +++ b/inst/extdata/OSD/K/KIRO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/K/KIWANIS.json b/inst/extdata/OSD/K/KIWANIS.json index c9dbd46063..8aa0d20699 100644 --- a/inst/extdata/OSD/K/KIWANIS.json +++ b/inst/extdata/OSD/K/KIWANIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KLADNICK.json b/inst/extdata/OSD/K/KLADNICK.json index 6565865210..2629189948 100644 --- a/inst/extdata/OSD/K/KLADNICK.json +++ b/inst/extdata/OSD/K/KLADNICK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KLANELNEECHENA.json b/inst/extdata/OSD/K/KLANELNEECHENA.json index ab0f07eb26..033f051043 100644 --- a/inst/extdata/OSD/K/KLANELNEECHENA.json +++ b/inst/extdata/OSD/K/KLANELNEECHENA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KLASI.json b/inst/extdata/OSD/K/KLASI.json index fe7ccb8851..1ea9844f8a 100644 --- a/inst/extdata/OSD/K/KLASI.json +++ b/inst/extdata/OSD/K/KLASI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KLAWASI.json b/inst/extdata/OSD/K/KLAWASI.json index 4d77368c29..0286a60230 100644 --- a/inst/extdata/OSD/K/KLAWASI.json +++ b/inst/extdata/OSD/K/KLAWASI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KLOOTCH.json b/inst/extdata/OSD/K/KLOOTCH.json index 4f21f45901..75c113b9ed 100644 --- a/inst/extdata/OSD/K/KLOOTCH.json +++ b/inst/extdata/OSD/K/KLOOTCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KLUTCH.json b/inst/extdata/OSD/K/KLUTCH.json index d285579dbf..5cea459cc9 100644 --- a/inst/extdata/OSD/K/KLUTCH.json +++ b/inst/extdata/OSD/K/KLUTCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KLUTE.json b/inst/extdata/OSD/K/KLUTE.json index cf6e366f65..33f26c91c1 100644 --- a/inst/extdata/OSD/K/KLUTE.json +++ b/inst/extdata/OSD/K/KLUTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KNEERIDGE.json b/inst/extdata/OSD/K/KNEERIDGE.json index 9432abf781..81a4523615 100644 --- a/inst/extdata/OSD/K/KNEERIDGE.json +++ b/inst/extdata/OSD/K/KNEERIDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KNICKERBOCKER.json b/inst/extdata/OSD/K/KNICKERBOCKER.json index 009a830bf3..749f177c52 100644 --- a/inst/extdata/OSD/K/KNICKERBOCKER.json +++ b/inst/extdata/OSD/K/KNICKERBOCKER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KNOBBY.json b/inst/extdata/OSD/K/KNOBBY.json index 8e2e1b8402..dc706e2e68 100644 --- a/inst/extdata/OSD/K/KNOBBY.json +++ b/inst/extdata/OSD/K/KNOBBY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/K/KNOB_LOCK.json b/inst/extdata/OSD/K/KNOB_LOCK.json index 79adfed534..69b8d9fd90 100644 --- a/inst/extdata/OSD/K/KNOB_LOCK.json +++ b/inst/extdata/OSD/K/KNOB_LOCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KNULL.json b/inst/extdata/OSD/K/KNULL.json index 032a51912e..3598d3b524 100644 --- a/inst/extdata/OSD/K/KNULL.json +++ b/inst/extdata/OSD/K/KNULL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KOBEL.json b/inst/extdata/OSD/K/KOBEL.json index 0f1a445ab2..e258b8bd1a 100644 --- a/inst/extdata/OSD/K/KOBEL.json +++ b/inst/extdata/OSD/K/KOBEL.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KOGISH.json b/inst/extdata/OSD/K/KOGISH.json index c524e5a94d..ea4475969f 100644 --- a/inst/extdata/OSD/K/KOGISH.json +++ b/inst/extdata/OSD/K/KOGISH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KOLLS.json b/inst/extdata/OSD/K/KOLLS.json index 13973522b2..acfa4097cc 100644 --- a/inst/extdata/OSD/K/KOLLS.json +++ b/inst/extdata/OSD/K/KOLLS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KOLOB.json b/inst/extdata/OSD/K/KOLOB.json index 1643dcf153..e730ce819c 100644 --- a/inst/extdata/OSD/K/KOLOB.json +++ b/inst/extdata/OSD/K/KOLOB.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KONZA.json b/inst/extdata/OSD/K/KONZA.json index 9577d21b28..9ac506982a 100644 --- a/inst/extdata/OSD/K/KONZA.json +++ b/inst/extdata/OSD/K/KONZA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/K/KRATKA.json b/inst/extdata/OSD/K/KRATKA.json index f246e71aee..78c86cc30c 100644 --- a/inst/extdata/OSD/K/KRATKA.json +++ b/inst/extdata/OSD/K/KRATKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KRUM.json b/inst/extdata/OSD/K/KRUM.json index fbc97c60c3..3c36c4ce86 100644 --- a/inst/extdata/OSD/K/KRUM.json +++ b/inst/extdata/OSD/K/KRUM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KUCERA.json b/inst/extdata/OSD/K/KUCERA.json index 685a723bee..818b6f503e 100644 --- a/inst/extdata/OSD/K/KUCERA.json +++ b/inst/extdata/OSD/K/KUCERA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/K/KULANI.json b/inst/extdata/OSD/K/KULANI.json index 5b08e82311..b5c8b0a709 100644 --- a/inst/extdata/OSD/K/KULANI.json +++ b/inst/extdata/OSD/K/KULANI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/K/KUNAYOSH.json b/inst/extdata/OSD/K/KUNAYOSH.json index ae7617ada0..362dae93d8 100644 --- a/inst/extdata/OSD/K/KUNAYOSH.json +++ b/inst/extdata/OSD/K/KUNAYOSH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/K/KUSLINA.json b/inst/extdata/OSD/K/KUSLINA.json index 0e10e7ddfb..0bee222c4e 100644 --- a/inst/extdata/OSD/K/KUSLINA.json +++ b/inst/extdata/OSD/K/KUSLINA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KUSLINAD.json b/inst/extdata/OSD/K/KUSLINAD.json index 0b8d593d6c..293857e766 100644 --- a/inst/extdata/OSD/K/KUSLINAD.json +++ b/inst/extdata/OSD/K/KUSLINAD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/K/KUTCH.json b/inst/extdata/OSD/K/KUTCH.json index 8700847cdd..d7e1ca4feb 100644 --- a/inst/extdata/OSD/K/KUTCH.json +++ b/inst/extdata/OSD/K/KUTCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/K/KUY.json b/inst/extdata/OSD/K/KUY.json index cb06b32838..e6f3e52f48 100644 --- a/inst/extdata/OSD/K/KUY.json +++ b/inst/extdata/OSD/K/KUY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/K/KYGER.json b/inst/extdata/OSD/K/KYGER.json index 5fee2ea41e..1ec0c6ea8b 100644 --- a/inst/extdata/OSD/K/KYGER.json +++ b/inst/extdata/OSD/K/KYGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/L/LABETTE.json b/inst/extdata/OSD/L/LABETTE.json index 34edcf5c15..d41c9d0025 100644 --- a/inst/extdata/OSD/L/LABETTE.json +++ b/inst/extdata/OSD/L/LABETTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LACKSTOWN.json b/inst/extdata/OSD/L/LACKSTOWN.json index 946272799f..c4837007d2 100644 --- a/inst/extdata/OSD/L/LACKSTOWN.json +++ b/inst/extdata/OSD/L/LACKSTOWN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LACOTA.json b/inst/extdata/OSD/L/LACOTA.json index 19d96e50b9..4c16145859 100644 --- a/inst/extdata/OSD/L/LACOTA.json +++ b/inst/extdata/OSD/L/LACOTA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LADDERLAKE.json b/inst/extdata/OSD/L/LADDERLAKE.json index 8ade0726ae..257e1c6f8d 100644 --- a/inst/extdata/OSD/L/LADDERLAKE.json +++ b/inst/extdata/OSD/L/LADDERLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LADYSMITH.json b/inst/extdata/OSD/L/LADYSMITH.json index f9397563a2..adacd24e3b 100644 --- a/inst/extdata/OSD/L/LADYSMITH.json +++ b/inst/extdata/OSD/L/LADYSMITH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/L/LAIRDSVILLE.json b/inst/extdata/OSD/L/LAIRDSVILLE.json index 94e9062c50..c76aea92b7 100644 --- a/inst/extdata/OSD/L/LAIRDSVILLE.json +++ b/inst/extdata/OSD/L/LAIRDSVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "moderately well to well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LAKEMONT.json b/inst/extdata/OSD/L/LAKEMONT.json index 78ddb4bad5..fba7ee2832 100644 --- a/inst/extdata/OSD/L/LAKEMONT.json +++ b/inst/extdata/OSD/L/LAKEMONT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LAKETWIN.json b/inst/extdata/OSD/L/LAKETWIN.json index 25b3aa83d5..7872f49661 100644 --- a/inst/extdata/OSD/L/LAKETWIN.json +++ b/inst/extdata/OSD/L/LAKETWIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LAKEVIEW.json b/inst/extdata/OSD/L/LAKEVIEW.json index d74c1b3eb9..9db7b18d24 100644 --- a/inst/extdata/OSD/L/LAKEVIEW.json +++ b/inst/extdata/OSD/L/LAKEVIEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LALLIE.json b/inst/extdata/OSD/L/LALLIE.json index bca963332b..ad4983fb47 100644 --- a/inst/extdata/OSD/L/LALLIE.json +++ b/inst/extdata/OSD/L/LALLIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LAMARSH.json b/inst/extdata/OSD/L/LAMARSH.json index 6eae0f3775..ca3628f382 100644 --- a/inst/extdata/OSD/L/LAMARSH.json +++ b/inst/extdata/OSD/L/LAMARSH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LAMBERT.json b/inst/extdata/OSD/L/LAMBERT.json index 297175687c..fb4df4d068 100644 --- a/inst/extdata/OSD/L/LAMBERT.json +++ b/inst/extdata/OSD/L/LAMBERT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LAMOURE.json b/inst/extdata/OSD/L/LAMOURE.json index afac16b9a0..4a97f1f183 100644 --- a/inst/extdata/OSD/L/LAMOURE.json +++ b/inst/extdata/OSD/L/LAMOURE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LAMSON.json b/inst/extdata/OSD/L/LAMSON.json index b8e2d5c6b5..73a6d19eb6 100644 --- a/inst/extdata/OSD/L/LAMSON.json +++ b/inst/extdata/OSD/L/LAMSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LANCASTER.json b/inst/extdata/OSD/L/LANCASTER.json index 77c3a5f914..050e8983ac 100644 --- a/inst/extdata/OSD/L/LANCASTER.json +++ b/inst/extdata/OSD/L/LANCASTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LANE.json b/inst/extdata/OSD/L/LANE.json index de9234392c..7819b8af32 100644 --- a/inst/extdata/OSD/L/LANE.json +++ b/inst/extdata/OSD/L/LANE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LANEY.json b/inst/extdata/OSD/L/LANEY.json index f9d0ec3910..9f157c83db 100644 --- a/inst/extdata/OSD/L/LANEY.json +++ b/inst/extdata/OSD/L/LANEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LANG.json b/inst/extdata/OSD/L/LANG.json index 5525f91988..f25911a653 100644 --- a/inst/extdata/OSD/L/LANG.json +++ b/inst/extdata/OSD/L/LANG.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LANIGER.json b/inst/extdata/OSD/L/LANIGER.json index 169a73b8d8..0910075fc1 100644 --- a/inst/extdata/OSD/L/LANIGER.json +++ b/inst/extdata/OSD/L/LANIGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LANKTREE.json b/inst/extdata/OSD/L/LANKTREE.json index e03e697347..fbbd0c80b2 100644 --- a/inst/extdata/OSD/L/LANKTREE.json +++ b/inst/extdata/OSD/L/LANKTREE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LANSDOWNE.json b/inst/extdata/OSD/L/LANSDOWNE.json index e75f2fc33d..15ded3668f 100644 --- a/inst/extdata/OSD/L/LANSDOWNE.json +++ b/inst/extdata/OSD/L/LANSDOWNE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LANTON.json b/inst/extdata/OSD/L/LANTON.json index 7441e53b3a..3d182b6799 100644 --- a/inst/extdata/OSD/L/LANTON.json +++ b/inst/extdata/OSD/L/LANTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LARKSON.json b/inst/extdata/OSD/L/LARKSON.json index 59e4e3c7b0..84f76fc023 100644 --- a/inst/extdata/OSD/L/LARKSON.json +++ b/inst/extdata/OSD/L/LARKSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LARSON.json b/inst/extdata/OSD/L/LARSON.json index 589062cd46..0d91db9778 100644 --- a/inst/extdata/OSD/L/LARSON.json +++ b/inst/extdata/OSD/L/LARSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LASSEL.json b/inst/extdata/OSD/L/LASSEL.json index d665a78411..49871115f5 100644 --- a/inst/extdata/OSD/L/LASSEL.json +++ b/inst/extdata/OSD/L/LASSEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LAS_ANIMAS.json b/inst/extdata/OSD/L/LAS_ANIMAS.json index 0b5ae68297..7a6dbf41a8 100644 --- a/inst/extdata/OSD/L/LAS_ANIMAS.json +++ b/inst/extdata/OSD/L/LAS_ANIMAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LAS_FLORES.json b/inst/extdata/OSD/L/LAS_FLORES.json index 62dc173599..5388402c44 100644 --- a/inst/extdata/OSD/L/LAS_FLORES.json +++ b/inst/extdata/OSD/L/LAS_FLORES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LATENE.json b/inst/extdata/OSD/L/LATENE.json index ca6f317705..33972e9bce 100644 --- a/inst/extdata/OSD/L/LATENE.json +++ b/inst/extdata/OSD/L/LATENE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LATOM.json b/inst/extdata/OSD/L/LATOM.json index 659b127433..6982ba661e 100644 --- a/inst/extdata/OSD/L/LATOM.json +++ b/inst/extdata/OSD/L/LATOM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LAUGHLIN.json b/inst/extdata/OSD/L/LAUGHLIN.json index f3b42d8c55..abe84ce168 100644 --- a/inst/extdata/OSD/L/LAUGHLIN.json +++ b/inst/extdata/OSD/L/LAUGHLIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LAVELDO.json b/inst/extdata/OSD/L/LAVELDO.json index 42e117a36b..693db9a74b 100644 --- a/inst/extdata/OSD/L/LAVELDO.json +++ b/inst/extdata/OSD/L/LAVELDO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "moderately well", + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LAVINA.json b/inst/extdata/OSD/L/LAVINA.json index 8e8949a376..f7d8cf4b71 100644 --- a/inst/extdata/OSD/L/LAVINA.json +++ b/inst/extdata/OSD/L/LAVINA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LAWARD.json b/inst/extdata/OSD/L/LAWARD.json index 4bf08682a8..908ae703cb 100644 --- a/inst/extdata/OSD/L/LAWARD.json +++ b/inst/extdata/OSD/L/LAWARD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/L/LAWET.json b/inst/extdata/OSD/L/LAWET.json index 2487735cb2..02b897fb1a 100644 --- a/inst/extdata/OSD/L/LAWET.json +++ b/inst/extdata/OSD/L/LAWET.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LAYTON.json b/inst/extdata/OSD/L/LAYTON.json index 85bba2d198..3ffb24d010 100644 --- a/inst/extdata/OSD/L/LAYTON.json +++ b/inst/extdata/OSD/L/LAYTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LEBEC.json b/inst/extdata/OSD/L/LEBEC.json index 0bce839624..6d6961957a 100644 --- a/inst/extdata/OSD/L/LEBEC.json +++ b/inst/extdata/OSD/L/LEBEC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LEBSACK.json b/inst/extdata/OSD/L/LEBSACK.json index 30378a9008..5548e1b2ae 100644 --- a/inst/extdata/OSD/L/LEBSACK.json +++ b/inst/extdata/OSD/L/LEBSACK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/L/LEDMOUNT.json b/inst/extdata/OSD/L/LEDMOUNT.json index d7428b60e9..9c1ee7750b 100644 --- a/inst/extdata/OSD/L/LEDMOUNT.json +++ b/inst/extdata/OSD/L/LEDMOUNT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LEEDS.json b/inst/extdata/OSD/L/LEEDS.json index a8b9e41380..9940ae17ac 100644 --- a/inst/extdata/OSD/L/LEEDS.json +++ b/inst/extdata/OSD/L/LEEDS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LEETON.json b/inst/extdata/OSD/L/LEETON.json index 0a93eb180c..30d2e5a265 100644 --- a/inst/extdata/OSD/L/LEETON.json +++ b/inst/extdata/OSD/L/LEETON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LEETONIA.json b/inst/extdata/OSD/L/LEETONIA.json index ec6d0b2a0a..aa9a706ac5 100644 --- a/inst/extdata/OSD/L/LEETONIA.json +++ b/inst/extdata/OSD/L/LEETONIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LEGAULT.json b/inst/extdata/OSD/L/LEGAULT.json index 27c88335e1..c5daa9b4db 100644 --- a/inst/extdata/OSD/L/LEGAULT.json +++ b/inst/extdata/OSD/L/LEGAULT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LEHEW.json b/inst/extdata/OSD/L/LEHEW.json index ac609b91e3..a3126d054c 100644 --- a/inst/extdata/OSD/L/LEHEW.json +++ b/inst/extdata/OSD/L/LEHEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LEHIGH.json b/inst/extdata/OSD/L/LEHIGH.json index 7505371c1e..519a29453a 100644 --- a/inst/extdata/OSD/L/LEHIGH.json +++ b/inst/extdata/OSD/L/LEHIGH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LELAND.json b/inst/extdata/OSD/L/LELAND.json index 2b44713132..d0c60af763 100644 --- a/inst/extdata/OSD/L/LELAND.json +++ b/inst/extdata/OSD/L/LELAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LEMCO.json b/inst/extdata/OSD/L/LEMCO.json index 0cd5c204ae..f985b8af5d 100644 --- a/inst/extdata/OSD/L/LEMCO.json +++ b/inst/extdata/OSD/L/LEMCO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LEMERT.json b/inst/extdata/OSD/L/LEMERT.json index 68fd48fa81..6e6487f2b4 100644 --- a/inst/extdata/OSD/L/LEMERT.json +++ b/inst/extdata/OSD/L/LEMERT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LEMOND.json b/inst/extdata/OSD/L/LEMOND.json index c930459681..0c8e6c4000 100644 --- a/inst/extdata/OSD/L/LEMOND.json +++ b/inst/extdata/OSD/L/LEMOND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LENAWEE.json b/inst/extdata/OSD/L/LENAWEE.json index ae6204de74..f65d71f00d 100644 --- a/inst/extdata/OSD/L/LENAWEE.json +++ b/inst/extdata/OSD/L/LENAWEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LENZ.json b/inst/extdata/OSD/L/LENZ.json index a69b86ab0c..301d9a52a8 100644 --- a/inst/extdata/OSD/L/LENZ.json +++ b/inst/extdata/OSD/L/LENZ.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LEON.json b/inst/extdata/OSD/L/LEON.json index 25a43eb40c..e2a4d2e299 100644 --- a/inst/extdata/OSD/L/LEON.json +++ b/inst/extdata/OSD/L/LEON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LEONARDO.json b/inst/extdata/OSD/L/LEONARDO.json index 33ff9e141c..ba1f3fe2bf 100644 --- a/inst/extdata/OSD/L/LEONARDO.json +++ b/inst/extdata/OSD/L/LEONARDO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LERCH.json b/inst/extdata/OSD/L/LERCH.json index cfe9a784fd..a81115fc25 100644 --- a/inst/extdata/OSD/L/LERCH.json +++ b/inst/extdata/OSD/L/LERCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LESLIE.json b/inst/extdata/OSD/L/LESLIE.json index eb05965161..5db61842c6 100644 --- a/inst/extdata/OSD/L/LESLIE.json +++ b/inst/extdata/OSD/L/LESLIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LETCHER.json b/inst/extdata/OSD/L/LETCHER.json index 774728c820..1031bbd8dc 100644 --- a/inst/extdata/OSD/L/LETCHER.json +++ b/inst/extdata/OSD/L/LETCHER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LEVASY.json b/inst/extdata/OSD/L/LEVASY.json index 111a8c826c..a614a4a2fa 100644 --- a/inst/extdata/OSD/L/LEVASY.json +++ b/inst/extdata/OSD/L/LEVASY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LEWISVILLE.json b/inst/extdata/OSD/L/LEWISVILLE.json index 0909cc289b..c8a3a6d217 100644 --- a/inst/extdata/OSD/L/LEWISVILLE.json +++ b/inst/extdata/OSD/L/LEWISVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LIGNUM.json b/inst/extdata/OSD/L/LIGNUM.json index 880a2c8959..f79945220d 100644 --- a/inst/extdata/OSD/L/LIGNUM.json +++ b/inst/extdata/OSD/L/LIGNUM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LIHEN.json b/inst/extdata/OSD/L/LIHEN.json index 8ebf655a4b..eef0a4a95b 100644 --- a/inst/extdata/OSD/L/LIHEN.json +++ b/inst/extdata/OSD/L/LIHEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or well", - "drainage_overview": "somewhat excessively or well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LINGANORE.json b/inst/extdata/OSD/L/LINGANORE.json index aaf2aa3598..b403ed6aed 100644 --- a/inst/extdata/OSD/L/LINGANORE.json +++ b/inst/extdata/OSD/L/LINGANORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LINNET.json b/inst/extdata/OSD/L/LINNET.json index d1d5f57e06..d0c8743122 100644 --- a/inst/extdata/OSD/L/LINNET.json +++ b/inst/extdata/OSD/L/LINNET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LIPAN.json b/inst/extdata/OSD/L/LIPAN.json index 8f1f924e39..68b141a57d 100644 --- a/inst/extdata/OSD/L/LIPAN.json +++ b/inst/extdata/OSD/L/LIPAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LISCO.json b/inst/extdata/OSD/L/LISCO.json index 908148bebc..d874423577 100644 --- a/inst/extdata/OSD/L/LISCO.json +++ b/inst/extdata/OSD/L/LISCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LITHGOW.json b/inst/extdata/OSD/L/LITHGOW.json index 6313f7717d..d8f669f248 100644 --- a/inst/extdata/OSD/L/LITHGOW.json +++ b/inst/extdata/OSD/L/LITHGOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LITIMBER.json b/inst/extdata/OSD/L/LITIMBER.json index 15d42fa98c..5b9ccff26a 100644 --- a/inst/extdata/OSD/L/LITIMBER.json +++ b/inst/extdata/OSD/L/LITIMBER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LITTLEWATER.json b/inst/extdata/OSD/L/LITTLEWATER.json index ffd2efc5e4..3232a3302c 100644 --- a/inst/extdata/OSD/L/LITTLEWATER.json +++ b/inst/extdata/OSD/L/LITTLEWATER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LIVENGOOD.json b/inst/extdata/OSD/L/LIVENGOOD.json index b06fffeee7..654231a15d 100644 --- a/inst/extdata/OSD/L/LIVENGOOD.json +++ b/inst/extdata/OSD/L/LIVENGOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LIZA.json b/inst/extdata/OSD/L/LIZA.json index 53c1c01692..cd8e651474 100644 --- a/inst/extdata/OSD/L/LIZA.json +++ b/inst/extdata/OSD/L/LIZA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LIZDALE.json b/inst/extdata/OSD/L/LIZDALE.json index c996dac058..cfd1c28f61 100644 --- a/inst/extdata/OSD/L/LIZDALE.json +++ b/inst/extdata/OSD/L/LIZDALE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/L/LIZE.json b/inst/extdata/OSD/L/LIZE.json index 89d3f2d99e..51d16042da 100644 --- a/inst/extdata/OSD/L/LIZE.json +++ b/inst/extdata/OSD/L/LIZE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LODAR.json b/inst/extdata/OSD/L/LODAR.json index 9256cc95a5..561742aa8e 100644 --- a/inst/extdata/OSD/L/LODAR.json +++ b/inst/extdata/OSD/L/LODAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LODGEPOLE.json b/inst/extdata/OSD/L/LODGEPOLE.json index 44ac3f7a28..c54974a390 100644 --- a/inst/extdata/OSD/L/LODGEPOLE.json +++ b/inst/extdata/OSD/L/LODGEPOLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/L/LOGAN.json b/inst/extdata/OSD/L/LOGAN.json index 63b1df1fb1..a93a24511b 100644 --- a/inst/extdata/OSD/L/LOGAN.json +++ b/inst/extdata/OSD/L/LOGAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/L/LOGDELL.json b/inst/extdata/OSD/L/LOGDELL.json index c87071f39b..d8d2adaf04 100644 --- a/inst/extdata/OSD/L/LOGDELL.json +++ b/inst/extdata/OSD/L/LOGDELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LOGY.json b/inst/extdata/OSD/L/LOGY.json index c1a0816d14..9e1f245140 100644 --- a/inst/extdata/OSD/L/LOGY.json +++ b/inst/extdata/OSD/L/LOGY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well and somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LOHLER.json b/inst/extdata/OSD/L/LOHLER.json index cc0480bbfb..cfe57dbac3 100644 --- a/inst/extdata/OSD/L/LOHLER.json +++ b/inst/extdata/OSD/L/LOHLER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LOLALITA.json b/inst/extdata/OSD/L/LOLALITA.json index 434981b52c..aed8bd8541 100644 --- a/inst/extdata/OSD/L/LOLALITA.json +++ b/inst/extdata/OSD/L/LOLALITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LONE.json b/inst/extdata/OSD/L/LONE.json index 6e42ba8055..e2501e5760 100644 --- a/inst/extdata/OSD/L/LONE.json +++ b/inst/extdata/OSD/L/LONE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LONETREE.json b/inst/extdata/OSD/L/LONETREE.json index 5e34766b9e..da70b913b4 100644 --- a/inst/extdata/OSD/L/LONETREE.json +++ b/inst/extdata/OSD/L/LONETREE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LONE_ROCK.json b/inst/extdata/OSD/L/LONE_ROCK.json index 23b69e79d5..ed33d35c87 100644 --- a/inst/extdata/OSD/L/LONE_ROCK.json +++ b/inst/extdata/OSD/L/LONE_ROCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LONGDRIVE.json b/inst/extdata/OSD/L/LONGDRIVE.json index ec89b5629b..59b7da1189 100644 --- a/inst/extdata/OSD/L/LONGDRIVE.json +++ b/inst/extdata/OSD/L/LONGDRIVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LONGPOINT.json b/inst/extdata/OSD/L/LONGPOINT.json index 3c6fc1d56d..1f3dee9d18 100644 --- a/inst/extdata/OSD/L/LONGPOINT.json +++ b/inst/extdata/OSD/L/LONGPOINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/L/LONTI.json b/inst/extdata/OSD/L/LONTI.json index bfd46c7768..2e05c57aee 100644 --- a/inst/extdata/OSD/L/LONTI.json +++ b/inst/extdata/OSD/L/LONTI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LORACK.json b/inst/extdata/OSD/L/LORACK.json index 4cebcfea0e..5c1eb43f27 100644 --- a/inst/extdata/OSD/L/LORACK.json +++ b/inst/extdata/OSD/L/LORACK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LOSTBEAR.json b/inst/extdata/OSD/L/LOSTBEAR.json index 1f4f46fd4d..25b1bb0421 100644 --- a/inst/extdata/OSD/L/LOSTBEAR.json +++ b/inst/extdata/OSD/L/LOSTBEAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/L/LOSTFORK.json b/inst/extdata/OSD/L/LOSTFORK.json index c96a247ec7..883bb14479 100644 --- a/inst/extdata/OSD/L/LOSTFORK.json +++ b/inst/extdata/OSD/L/LOSTFORK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LOSTINE.json b/inst/extdata/OSD/L/LOSTINE.json index 7a68675db6..95e2625332 100644 --- a/inst/extdata/OSD/L/LOSTINE.json +++ b/inst/extdata/OSD/L/LOSTINE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LOS_GATOS.json b/inst/extdata/OSD/L/LOS_GATOS.json index f24a7a5de9..f3248f70e7 100644 --- a/inst/extdata/OSD/L/LOS_GATOS.json +++ b/inst/extdata/OSD/L/LOS_GATOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LOTT.json b/inst/extdata/OSD/L/LOTT.json index be1ac7fe57..3eb40708f1 100644 --- a/inst/extdata/OSD/L/LOTT.json +++ b/inst/extdata/OSD/L/LOTT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LOTUS.json b/inst/extdata/OSD/L/LOTUS.json index bc0b06d2ef..ba5ffb6625 100644 --- a/inst/extdata/OSD/L/LOTUS.json +++ b/inst/extdata/OSD/L/LOTUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/L/LOUISBURG.json b/inst/extdata/OSD/L/LOUISBURG.json index ba0376fe32..97566ab544 100644 --- a/inst/extdata/OSD/L/LOUISBURG.json +++ b/inst/extdata/OSD/L/LOUISBURG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LOUP.json b/inst/extdata/OSD/L/LOUP.json index 32d91c9424..b8d47a942f 100644 --- a/inst/extdata/OSD/L/LOUP.json +++ b/inst/extdata/OSD/L/LOUP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LOUPENCE.json b/inst/extdata/OSD/L/LOUPENCE.json index 9cec521c9e..d494b833bd 100644 --- a/inst/extdata/OSD/L/LOUPENCE.json +++ b/inst/extdata/OSD/L/LOUPENCE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LOUSECREEK.json b/inst/extdata/OSD/L/LOUSECREEK.json index 6765cdfb3e..d71e70efa5 100644 --- a/inst/extdata/OSD/L/LOUSECREEK.json +++ b/inst/extdata/OSD/L/LOUSECREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LOVEJOY.json b/inst/extdata/OSD/L/LOVEJOY.json index 550b1abf47..5893b3157c 100644 --- a/inst/extdata/OSD/L/LOVEJOY.json +++ b/inst/extdata/OSD/L/LOVEJOY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LOWE.json b/inst/extdata/OSD/L/LOWE.json index 1b29cbc8e2..f40257d692 100644 --- a/inst/extdata/OSD/L/LOWE.json +++ b/inst/extdata/OSD/L/LOWE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/L/LUCE.json b/inst/extdata/OSD/L/LUCE.json index 9945aaf96b..1f044b5418 100644 --- a/inst/extdata/OSD/L/LUCE.json +++ b/inst/extdata/OSD/L/LUCE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LUCKNOW.json b/inst/extdata/OSD/L/LUCKNOW.json index 8d41a066cc..21b28875d4 100644 --- a/inst/extdata/OSD/L/LUCKNOW.json +++ b/inst/extdata/OSD/L/LUCKNOW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/L/LUDDEN.json b/inst/extdata/OSD/L/LUDDEN.json index 893703cba4..e3c6e8cb45 100644 --- a/inst/extdata/OSD/L/LUDDEN.json +++ b/inst/extdata/OSD/L/LUDDEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LUKANIN.json b/inst/extdata/OSD/L/LUKANIN.json index bc4baf0ae9..cb3fc5062e 100644 --- a/inst/extdata/OSD/L/LUKANIN.json +++ b/inst/extdata/OSD/L/LUKANIN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/L/LURA.json b/inst/extdata/OSD/L/LURA.json index b725782406..a4d87b0efc 100644 --- a/inst/extdata/OSD/L/LURA.json +++ b/inst/extdata/OSD/L/LURA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LUTE.json b/inst/extdata/OSD/L/LUTE.json index afe535d518..b4a274a2a4 100644 --- a/inst/extdata/OSD/L/LUTE.json +++ b/inst/extdata/OSD/L/LUTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/L/LUTH.json b/inst/extdata/OSD/L/LUTH.json index 27234a1dab..6c3745dd08 100644 --- a/inst/extdata/OSD/L/LUTH.json +++ b/inst/extdata/OSD/L/LUTH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/L/LUTON.json b/inst/extdata/OSD/L/LUTON.json index 00c299a239..f666097e4f 100644 --- a/inst/extdata/OSD/L/LUTON.json +++ b/inst/extdata/OSD/L/LUTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LUXOR.json b/inst/extdata/OSD/L/LUXOR.json index de7355c803..6f88109e09 100644 --- a/inst/extdata/OSD/L/LUXOR.json +++ b/inst/extdata/OSD/L/LUXOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/L/LYERLY.json b/inst/extdata/OSD/L/LYERLY.json index 0254b1bd07..515ed54354 100644 --- a/inst/extdata/OSD/L/LYERLY.json +++ b/inst/extdata/OSD/L/LYERLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/L/LYNN_HAVEN.json b/inst/extdata/OSD/L/LYNN_HAVEN.json index 713d084dad..ce35e84f31 100644 --- a/inst/extdata/OSD/L/LYNN_HAVEN.json +++ b/inst/extdata/OSD/L/LYNN_HAVEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/L/LYONS.json b/inst/extdata/OSD/L/LYONS.json index ffd653a5c6..eaba61ccbe 100644 --- a/inst/extdata/OSD/L/LYONS.json +++ b/inst/extdata/OSD/L/LYONS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MACHAPUNGA.json b/inst/extdata/OSD/M/MACHAPUNGA.json index b269f5375d..ec284bcc2e 100644 --- a/inst/extdata/OSD/M/MACHAPUNGA.json +++ b/inst/extdata/OSD/M/MACHAPUNGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MACKEN.json b/inst/extdata/OSD/M/MACKEN.json index 55ae36e210..c5217b5ff9 100644 --- a/inst/extdata/OSD/M/MACKEN.json +++ b/inst/extdata/OSD/M/MACKEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MADAWASKA.json b/inst/extdata/OSD/M/MADAWASKA.json index bb196769ba..60bd519d84 100644 --- a/inst/extdata/OSD/M/MADAWASKA.json +++ b/inst/extdata/OSD/M/MADAWASKA.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MADBUTTES.json b/inst/extdata/OSD/M/MADBUTTES.json index 0138ff3b28..cd7bf9ece0 100644 --- a/inst/extdata/OSD/M/MADBUTTES.json +++ b/inst/extdata/OSD/M/MADBUTTES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MADDOCK.json b/inst/extdata/OSD/M/MADDOCK.json index 52f87da4b4..c2115ae64d 100644 --- a/inst/extdata/OSD/M/MADDOCK.json +++ b/inst/extdata/OSD/M/MADDOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MADERA.json b/inst/extdata/OSD/M/MADERA.json index 70d613e534..c843dcb1ff 100644 --- a/inst/extdata/OSD/M/MADERA.json +++ b/inst/extdata/OSD/M/MADERA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MADUREZ.json b/inst/extdata/OSD/M/MADUREZ.json index c90f9a9bdd..eacfc70105 100644 --- a/inst/extdata/OSD/M/MADUREZ.json +++ b/inst/extdata/OSD/M/MADUREZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MAGGIES.json b/inst/extdata/OSD/M/MAGGIES.json index 6733d384d4..980654eabb 100644 --- a/inst/extdata/OSD/M/MAGGIES.json +++ b/inst/extdata/OSD/M/MAGGIES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MAHALALAND.json b/inst/extdata/OSD/M/MAHALALAND.json index 73526a0e9c..c591907f81 100644 --- a/inst/extdata/OSD/M/MAHALALAND.json +++ b/inst/extdata/OSD/M/MAHALALAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAHALASVILLE.json b/inst/extdata/OSD/M/MAHALASVILLE.json index f52dc4ba01..702dff5dc1 100644 --- a/inst/extdata/OSD/M/MAHALASVILLE.json +++ b/inst/extdata/OSD/M/MAHALASVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAINTER.json b/inst/extdata/OSD/M/MAINTER.json index 63f667f48f..3e8edb19b3 100644 --- a/inst/extdata/OSD/M/MAINTER.json +++ b/inst/extdata/OSD/M/MAINTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MAJADA.json b/inst/extdata/OSD/M/MAJADA.json index ee60bd3079..1a3acf7a67 100644 --- a/inst/extdata/OSD/M/MAJADA.json +++ b/inst/extdata/OSD/M/MAJADA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MAKOTI.json b/inst/extdata/OSD/M/MAKOTI.json index e8d5a17494..1c0011a73a 100644 --- a/inst/extdata/OSD/M/MAKOTI.json +++ b/inst/extdata/OSD/M/MAKOTI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MALABAR.json b/inst/extdata/OSD/M/MALABAR.json index 0670da0f60..944a1dfea2 100644 --- a/inst/extdata/OSD/M/MALABAR.json +++ b/inst/extdata/OSD/M/MALABAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MALBIS.json b/inst/extdata/OSD/M/MALBIS.json index b95adc2c40..36dbf06d33 100644 --- a/inst/extdata/OSD/M/MALBIS.json +++ b/inst/extdata/OSD/M/MALBIS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MALINTA.json b/inst/extdata/OSD/M/MALINTA.json index cdbe64d51c..2b293a121d 100644 --- a/inst/extdata/OSD/M/MALINTA.json +++ b/inst/extdata/OSD/M/MALINTA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MALO.json b/inst/extdata/OSD/M/MALO.json index 16a9055d78..0f6ef2abf6 100644 --- a/inst/extdata/OSD/M/MALO.json +++ b/inst/extdata/OSD/M/MALO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MALTESE.json b/inst/extdata/OSD/M/MALTESE.json index 5c80785530..53c2ccd7f3 100644 --- a/inst/extdata/OSD/M/MALTESE.json +++ b/inst/extdata/OSD/M/MALTESE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MAMMOTH.json b/inst/extdata/OSD/M/MAMMOTH.json index b176d34fde..7990c08b1f 100644 --- a/inst/extdata/OSD/M/MAMMOTH.json +++ b/inst/extdata/OSD/M/MAMMOTH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MANADA.json b/inst/extdata/OSD/M/MANADA.json index b21ccea2f3..bf2a0156ef 100644 --- a/inst/extdata/OSD/M/MANADA.json +++ b/inst/extdata/OSD/M/MANADA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MANASSAS.json b/inst/extdata/OSD/M/MANASSAS.json index 7f5167d720..4f903a1f74 100644 --- a/inst/extdata/OSD/M/MANASSAS.json +++ b/inst/extdata/OSD/M/MANASSAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MANDEVILLE.json b/inst/extdata/OSD/M/MANDEVILLE.json index 88217459e7..0efd5aa532 100644 --- a/inst/extdata/OSD/M/MANDEVILLE.json +++ b/inst/extdata/OSD/M/MANDEVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MANFRED.json b/inst/extdata/OSD/M/MANFRED.json index de5a18ed18..b392fa6a07 100644 --- a/inst/extdata/OSD/M/MANFRED.json +++ b/inst/extdata/OSD/M/MANFRED.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MANKOMEN.json b/inst/extdata/OSD/M/MANKOMEN.json index dc50827f3f..71df433f85 100644 --- a/inst/extdata/OSD/M/MANKOMEN.json +++ b/inst/extdata/OSD/M/MANKOMEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MANLIUS.json b/inst/extdata/OSD/M/MANLIUS.json index 51d41a349f..57419ed17a 100644 --- a/inst/extdata/OSD/M/MANLIUS.json +++ b/inst/extdata/OSD/M/MANLIUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MANOR.json b/inst/extdata/OSD/M/MANOR.json index 85b1937a0e..d898ab9ebb 100644 --- a/inst/extdata/OSD/M/MANOR.json +++ b/inst/extdata/OSD/M/MANOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MANSON.json b/inst/extdata/OSD/M/MANSON.json index 45722c688b..4e4d0ab056 100644 --- a/inst/extdata/OSD/M/MANSON.json +++ b/inst/extdata/OSD/M/MANSON.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MANTER.json b/inst/extdata/OSD/M/MANTER.json index cf962beec2..adef747a9b 100644 --- a/inst/extdata/OSD/M/MANTER.json +++ b/inst/extdata/OSD/M/MANTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MANTOLOKING.json b/inst/extdata/OSD/M/MANTOLOKING.json index d016de09c1..34f0a040ec 100644 --- a/inst/extdata/OSD/M/MANTOLOKING.json +++ b/inst/extdata/OSD/M/MANTOLOKING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MAPLEGROVE.json b/inst/extdata/OSD/M/MAPLEGROVE.json index 78eaf324c2..c37d7ad8c4 100644 --- a/inst/extdata/OSD/M/MAPLEGROVE.json +++ b/inst/extdata/OSD/M/MAPLEGROVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/M/MAQUAM.json b/inst/extdata/OSD/M/MAQUAM.json index 2dbc6bbe01..394148fc88 100644 --- a/inst/extdata/OSD/M/MAQUAM.json +++ b/inst/extdata/OSD/M/MAQUAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MARATHON.json b/inst/extdata/OSD/M/MARATHON.json index d9db354135..0ada277f40 100644 --- a/inst/extdata/OSD/M/MARATHON.json +++ b/inst/extdata/OSD/M/MARATHON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MARBLEYARD.json b/inst/extdata/OSD/M/MARBLEYARD.json index 24a7d2acf2..39e863c469 100644 --- a/inst/extdata/OSD/M/MARBLEYARD.json +++ b/inst/extdata/OSD/M/MARBLEYARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MARCUS.json b/inst/extdata/OSD/M/MARCUS.json index 0f5301119a..8fc41a6a67 100644 --- a/inst/extdata/OSD/M/MARCUS.json +++ b/inst/extdata/OSD/M/MARCUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAREAS.json b/inst/extdata/OSD/M/MAREAS.json index df6f43c3e5..398599ecf4 100644 --- a/inst/extdata/OSD/M/MAREAS.json +++ b/inst/extdata/OSD/M/MAREAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MARGERUM.json b/inst/extdata/OSD/M/MARGERUM.json index 2128421259..ae9bd43ad0 100644 --- a/inst/extdata/OSD/M/MARGERUM.json +++ b/inst/extdata/OSD/M/MARGERUM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MARGO.json b/inst/extdata/OSD/M/MARGO.json index e8193ed653..4f77d3e208 100644 --- a/inst/extdata/OSD/M/MARGO.json +++ b/inst/extdata/OSD/M/MARGO.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MARIOLA.json b/inst/extdata/OSD/M/MARIOLA.json index 8730b94499..f1e304dbb6 100644 --- a/inst/extdata/OSD/M/MARIOLA.json +++ b/inst/extdata/OSD/M/MARIOLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MARIPOSA.json b/inst/extdata/OSD/M/MARIPOSA.json index 5c48afc19b..3effd4232d 100644 --- a/inst/extdata/OSD/M/MARIPOSA.json +++ b/inst/extdata/OSD/M/MARIPOSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MARISSA.json b/inst/extdata/OSD/M/MARISSA.json index 6595e19e2b..711b63d8bb 100644 --- a/inst/extdata/OSD/M/MARISSA.json +++ b/inst/extdata/OSD/M/MARISSA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MARKLEY.json b/inst/extdata/OSD/M/MARKLEY.json index b29d07ea23..92626ce033 100644 --- a/inst/extdata/OSD/M/MARKLEY.json +++ b/inst/extdata/OSD/M/MARKLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/M/MARLAKE.json b/inst/extdata/OSD/M/MARLAKE.json index 45989f50b1..c098c98535 100644 --- a/inst/extdata/OSD/M/MARLAKE.json +++ b/inst/extdata/OSD/M/MARLAKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/M/MARMOTLAND.json b/inst/extdata/OSD/M/MARMOTLAND.json index 996517e283..7b19f093ef 100644 --- a/inst/extdata/OSD/M/MARMOTLAND.json +++ b/inst/extdata/OSD/M/MARMOTLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MAROSA.json b/inst/extdata/OSD/M/MAROSA.json index 8fcfa8494d..08f5bc84f9 100644 --- a/inst/extdata/OSD/M/MAROSA.json +++ b/inst/extdata/OSD/M/MAROSA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MARSEILLES.json b/inst/extdata/OSD/M/MARSEILLES.json index 2bfcc88a7b..b6842a1bcb 100644 --- a/inst/extdata/OSD/M/MARSEILLES.json +++ b/inst/extdata/OSD/M/MARSEILLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MARSHAN.json b/inst/extdata/OSD/M/MARSHAN.json index 00a03bbef9..da62e29af1 100644 --- a/inst/extdata/OSD/M/MARSHAN.json +++ b/inst/extdata/OSD/M/MARSHAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MARSHBROOK.json b/inst/extdata/OSD/M/MARSHBROOK.json index c73753a0bc..ee4d9c7c99 100644 --- a/inst/extdata/OSD/M/MARSHBROOK.json +++ b/inst/extdata/OSD/M/MARSHBROOK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MARSHNECK.json b/inst/extdata/OSD/M/MARSHNECK.json index 1492172d28..3aef4f332b 100644 --- a/inst/extdata/OSD/M/MARSHNECK.json +++ b/inst/extdata/OSD/M/MARSHNECK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MARSING.json b/inst/extdata/OSD/M/MARSING.json index 66b7009f75..54c1f06c6b 100644 --- a/inst/extdata/OSD/M/MARSING.json +++ b/inst/extdata/OSD/M/MARSING.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MARTINECK.json b/inst/extdata/OSD/M/MARTINECK.json index ba161ddd45..357d15a0b6 100644 --- a/inst/extdata/OSD/M/MARTINECK.json +++ b/inst/extdata/OSD/M/MARTINECK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MARTINEZ.json b/inst/extdata/OSD/M/MARTINEZ.json index 100dc2ae85..6a449d558e 100644 --- a/inst/extdata/OSD/M/MARTINEZ.json +++ b/inst/extdata/OSD/M/MARTINEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MARTINSBURG.json b/inst/extdata/OSD/M/MARTINSBURG.json index 05c7a8702e..5c6824497e 100644 --- a/inst/extdata/OSD/M/MARTINSBURG.json +++ b/inst/extdata/OSD/M/MARTINSBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MARTY.json b/inst/extdata/OSD/M/MARTY.json index c7d10d6aa1..e869685656 100644 --- a/inst/extdata/OSD/M/MARTY.json +++ b/inst/extdata/OSD/M/MARTY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MARUMSCO.json b/inst/extdata/OSD/M/MARUMSCO.json index 9b172573b9..aa2cbc2959 100644 --- a/inst/extdata/OSD/M/MARUMSCO.json +++ b/inst/extdata/OSD/M/MARUMSCO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MARVIN.json b/inst/extdata/OSD/M/MARVIN.json index c08f42a16f..846ab878e2 100644 --- a/inst/extdata/OSD/M/MARVIN.json +++ b/inst/extdata/OSD/M/MARVIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MARYSLAND.json b/inst/extdata/OSD/M/MARYSLAND.json index 3758511d9e..17c7046318 100644 --- a/inst/extdata/OSD/M/MARYSLAND.json +++ b/inst/extdata/OSD/M/MARYSLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAR_NEGRO.json b/inst/extdata/OSD/M/MAR_NEGRO.json index 3ffe94d77b..84a223997a 100644 --- a/inst/extdata/OSD/M/MAR_NEGRO.json +++ b/inst/extdata/OSD/M/MAR_NEGRO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MASCOTTE.json b/inst/extdata/OSD/M/MASCOTTE.json index d3c64719c6..4c1721c297 100644 --- a/inst/extdata/OSD/M/MASCOTTE.json +++ b/inst/extdata/OSD/M/MASCOTTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MASON.json b/inst/extdata/OSD/M/MASON.json index dbcc0f96fb..d440aa6a94 100644 --- a/inst/extdata/OSD/M/MASON.json +++ b/inst/extdata/OSD/M/MASON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/M/MASSAPOG.json b/inst/extdata/OSD/M/MASSAPOG.json index da5c0b3b25..303bf9d4f4 100644 --- a/inst/extdata/OSD/M/MASSAPOG.json +++ b/inst/extdata/OSD/M/MASSAPOG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MASSBACH.json b/inst/extdata/OSD/M/MASSBACH.json index 66b932d1b2..6e12420e86 100644 --- a/inst/extdata/OSD/M/MASSBACH.json +++ b/inst/extdata/OSD/M/MASSBACH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MASSENA.json b/inst/extdata/OSD/M/MASSENA.json index 7e07308b99..f2cfbd02fe 100644 --- a/inst/extdata/OSD/M/MASSENA.json +++ b/inst/extdata/OSD/M/MASSENA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MASTERSON.json b/inst/extdata/OSD/M/MASTERSON.json index a95b28c778..bc73a1f4c6 100644 --- a/inst/extdata/OSD/M/MASTERSON.json +++ b/inst/extdata/OSD/M/MASTERSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MATHERS.json b/inst/extdata/OSD/M/MATHERS.json index 13c5b6b460..4756923e39 100644 --- a/inst/extdata/OSD/M/MATHERS.json +++ b/inst/extdata/OSD/M/MATHERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MATTAPONI.json b/inst/extdata/OSD/M/MATTAPONI.json index 05426e1b6a..2b6330bacb 100644 --- a/inst/extdata/OSD/M/MATTAPONI.json +++ b/inst/extdata/OSD/M/MATTAPONI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MAUDE.json b/inst/extdata/OSD/M/MAUDE.json index eaa2787dd5..dbf68e4363 100644 --- a/inst/extdata/OSD/M/MAUDE.json +++ b/inst/extdata/OSD/M/MAUDE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MAUKEY.json b/inst/extdata/OSD/M/MAUKEY.json index f98c572823..bea59024fc 100644 --- a/inst/extdata/OSD/M/MAUKEY.json +++ b/inst/extdata/OSD/M/MAUKEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MAUMEE.json b/inst/extdata/OSD/M/MAUMEE.json index 3cdd5b1f23..c1ad93abb8 100644 --- a/inst/extdata/OSD/M/MAUMEE.json +++ b/inst/extdata/OSD/M/MAUMEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAXCREEK.json b/inst/extdata/OSD/M/MAXCREEK.json index 5c58b4b0ee..8a3f2dfea6 100644 --- a/inst/extdata/OSD/M/MAXCREEK.json +++ b/inst/extdata/OSD/M/MAXCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAYBEE.json b/inst/extdata/OSD/M/MAYBEE.json index 8ae8aa7eea..1bef2c78e9 100644 --- a/inst/extdata/OSD/M/MAYBEE.json +++ b/inst/extdata/OSD/M/MAYBEE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MAYER.json b/inst/extdata/OSD/M/MAYER.json index dd5e7157e4..ad335599e5 100644 --- a/inst/extdata/OSD/M/MAYER.json +++ b/inst/extdata/OSD/M/MAYER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MAYHILL.json b/inst/extdata/OSD/M/MAYHILL.json index 7107e651a1..33342a5370 100644 --- a/inst/extdata/OSD/M/MAYHILL.json +++ b/inst/extdata/OSD/M/MAYHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MAYO.json b/inst/extdata/OSD/M/MAYO.json index e11a64a499..d922923a40 100644 --- a/inst/extdata/OSD/M/MAYO.json +++ b/inst/extdata/OSD/M/MAYO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MAYSDORF.json b/inst/extdata/OSD/M/MAYSDORF.json index 42645b1f07..4559811e31 100644 --- a/inst/extdata/OSD/M/MAYSDORF.json +++ b/inst/extdata/OSD/M/MAYSDORF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MAZOURKA.json b/inst/extdata/OSD/M/MAZOURKA.json index 8791ef403b..543a10866c 100644 --- a/inst/extdata/OSD/M/MAZOURKA.json +++ b/inst/extdata/OSD/M/MAZOURKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MCBIGGAM.json b/inst/extdata/OSD/M/MCBIGGAM.json index 3d04758e69..dd4a208f11 100644 --- a/inst/extdata/OSD/M/MCBIGGAM.json +++ b/inst/extdata/OSD/M/MCBIGGAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MCBRIDE.json b/inst/extdata/OSD/M/MCBRIDE.json index d3af919e06..abe3560799 100644 --- a/inst/extdata/OSD/M/MCBRIDE.json +++ b/inst/extdata/OSD/M/MCBRIDE.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MCCAFFERY.json b/inst/extdata/OSD/M/MCCAFFERY.json index 79cc50668d..49255ddfc6 100644 --- a/inst/extdata/OSD/M/MCCAFFERY.json +++ b/inst/extdata/OSD/M/MCCAFFERY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCCAMMON.json b/inst/extdata/OSD/M/MCCAMMON.json index d0242305c5..2f4534c1c1 100644 --- a/inst/extdata/OSD/M/MCCAMMON.json +++ b/inst/extdata/OSD/M/MCCAMMON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MCCANN.json b/inst/extdata/OSD/M/MCCANN.json index d0d34128c1..f131d499e3 100644 --- a/inst/extdata/OSD/M/MCCANN.json +++ b/inst/extdata/OSD/M/MCCANN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCCLAVE.json b/inst/extdata/OSD/M/MCCLAVE.json index 7f3c6a7fdb..f1f951b197 100644 --- a/inst/extdata/OSD/M/MCCLAVE.json +++ b/inst/extdata/OSD/M/MCCLAVE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MCCROSKET.json b/inst/extdata/OSD/M/MCCROSKET.json index 932348e8ee..ad5f1d673e 100644 --- a/inst/extdata/OSD/M/MCCROSKET.json +++ b/inst/extdata/OSD/M/MCCROSKET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCFAIN.json b/inst/extdata/OSD/M/MCFAIN.json index ec017d3b0d..6b9fec3635 100644 --- a/inst/extdata/OSD/M/MCFAIN.json +++ b/inst/extdata/OSD/M/MCFAIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MCGAFFEY.json b/inst/extdata/OSD/M/MCGAFFEY.json index 26164d4cbf..f65dffc2d9 100644 --- a/inst/extdata/OSD/M/MCGAFFEY.json +++ b/inst/extdata/OSD/M/MCGAFFEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MCGEE.json b/inst/extdata/OSD/M/MCGEE.json index 5250f1c3d5..6c9cbd64c1 100644 --- a/inst/extdata/OSD/M/MCGEE.json +++ b/inst/extdata/OSD/M/MCGEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MCLENNAN.json b/inst/extdata/OSD/M/MCLENNAN.json index d31b4ee30f..ac4e5ceed4 100644 --- a/inst/extdata/OSD/M/MCLENNAN.json +++ b/inst/extdata/OSD/M/MCLENNAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCMULLIN.json b/inst/extdata/OSD/M/MCMULLIN.json index 3d8871ef14..8679c119f6 100644 --- a/inst/extdata/OSD/M/MCMULLIN.json +++ b/inst/extdata/OSD/M/MCMULLIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MCMURDIE.json b/inst/extdata/OSD/M/MCMURDIE.json index 82499d8b41..dc69a3fda9 100644 --- a/inst/extdata/OSD/M/MCMURDIE.json +++ b/inst/extdata/OSD/M/MCMURDIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCPAUL.json b/inst/extdata/OSD/M/MCPAUL.json index 77df868568..5631f533be 100644 --- a/inst/extdata/OSD/M/MCPAUL.json +++ b/inst/extdata/OSD/M/MCPAUL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MCPHIE.json b/inst/extdata/OSD/M/MCPHIE.json index 72fdb27a2a..fe1b157e52 100644 --- a/inst/extdata/OSD/M/MCPHIE.json +++ b/inst/extdata/OSD/M/MCPHIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCQUARRIE.json b/inst/extdata/OSD/M/MCQUARRIE.json index 7ba8e7dd58..ffa1a30adb 100644 --- a/inst/extdata/OSD/M/MCQUARRIE.json +++ b/inst/extdata/OSD/M/MCQUARRIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MCRAE.json b/inst/extdata/OSD/M/MCRAE.json index 3a3b9f41e3..40a1e462b8 100644 --- a/inst/extdata/OSD/M/MCRAE.json +++ b/inst/extdata/OSD/M/MCRAE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MCVICKERS.json b/inst/extdata/OSD/M/MCVICKERS.json index 7e8c2ebc90..9edf202aa6 100644 --- a/inst/extdata/OSD/M/MCVICKERS.json +++ b/inst/extdata/OSD/M/MCVICKERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MEAD.json b/inst/extdata/OSD/M/MEAD.json index ac446034ae..912b5882ba 100644 --- a/inst/extdata/OSD/M/MEAD.json +++ b/inst/extdata/OSD/M/MEAD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/M/MEADOWBROOK.json b/inst/extdata/OSD/M/MEADOWBROOK.json index e995bf78c2..0097514488 100644 --- a/inst/extdata/OSD/M/MEADOWBROOK.json +++ b/inst/extdata/OSD/M/MEADOWBROOK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MEADOWVILLE.json b/inst/extdata/OSD/M/MEADOWVILLE.json index 76df58e331..aac990d529 100644 --- a/inst/extdata/OSD/M/MEADOWVILLE.json +++ b/inst/extdata/OSD/M/MEADOWVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "moderately well to well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MEDBURN.json b/inst/extdata/OSD/M/MEDBURN.json index 4d3a9519ff..a79ac92f28 100644 --- a/inst/extdata/OSD/M/MEDBURN.json +++ b/inst/extdata/OSD/M/MEDBURN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MEEKS.json b/inst/extdata/OSD/M/MEEKS.json index cb55e6ae23..793f495ae3 100644 --- a/inst/extdata/OSD/M/MEEKS.json +++ b/inst/extdata/OSD/M/MEEKS.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MEIKLE.json b/inst/extdata/OSD/M/MEIKLE.json index 21180f6e00..8cbe0b1914 100644 --- a/inst/extdata/OSD/M/MEIKLE.json +++ b/inst/extdata/OSD/M/MEIKLE.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "poorly and very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MELAKWA.json b/inst/extdata/OSD/M/MELAKWA.json index 734fb815d6..ecd66358a9 100644 --- a/inst/extdata/OSD/M/MELAKWA.json +++ b/inst/extdata/OSD/M/MELAKWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MELDER.json b/inst/extdata/OSD/M/MELDER.json index 4fc56bbfe1..a7784169ba 100644 --- a/inst/extdata/OSD/M/MELDER.json +++ b/inst/extdata/OSD/M/MELDER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MELLOR.json b/inst/extdata/OSD/M/MELLOR.json index 619ba0e669..8ee458efb6 100644 --- a/inst/extdata/OSD/M/MELLOR.json +++ b/inst/extdata/OSD/M/MELLOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MENAHGA.json b/inst/extdata/OSD/M/MENAHGA.json index 1b310feb4f..edce56819e 100644 --- a/inst/extdata/OSD/M/MENAHGA.json +++ b/inst/extdata/OSD/M/MENAHGA.json @@ -65,7 +65,7 @@ [ { "drainage": "excessively", - "drainage_overview": "excessively" + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MENDELTNA.json b/inst/extdata/OSD/M/MENDELTNA.json index a52e309214..26bc590be3 100644 --- a/inst/extdata/OSD/M/MENDELTNA.json +++ b/inst/extdata/OSD/M/MENDELTNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MENDNA.json b/inst/extdata/OSD/M/MENDNA.json index 8328171800..9dd623d134 100644 --- a/inst/extdata/OSD/M/MENDNA.json +++ b/inst/extdata/OSD/M/MENDNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MENEFEE.json b/inst/extdata/OSD/M/MENEFEE.json index a6ee6384a4..b8442c90c1 100644 --- a/inst/extdata/OSD/M/MENEFEE.json +++ b/inst/extdata/OSD/M/MENEFEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MENTZ.json b/inst/extdata/OSD/M/MENTZ.json index e3aec5aecc..b787740621 100644 --- a/inst/extdata/OSD/M/MENTZ.json +++ b/inst/extdata/OSD/M/MENTZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/M/MERDEN.json b/inst/extdata/OSD/M/MERDEN.json index c568cf4108..26657349e1 100644 --- a/inst/extdata/OSD/M/MERDEN.json +++ b/inst/extdata/OSD/M/MERDEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MESCAL.json b/inst/extdata/OSD/M/MESCAL.json index f0a6e84f8e..1a98055693 100644 --- a/inst/extdata/OSD/M/MESCAL.json +++ b/inst/extdata/OSD/M/MESCAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MET.json b/inst/extdata/OSD/M/MET.json index e6776d6b25..2667b8f14a 100644 --- a/inst/extdata/OSD/M/MET.json +++ b/inst/extdata/OSD/M/MET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/METEDECONK.json b/inst/extdata/OSD/M/METEDECONK.json index 0bcc6eed89..75616a1ddf 100644 --- a/inst/extdata/OSD/M/METEDECONK.json +++ b/inst/extdata/OSD/M/METEDECONK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MICHELSON.json b/inst/extdata/OSD/M/MICHELSON.json index ae38cc93df..8aa2af5bbe 100644 --- a/inst/extdata/OSD/M/MICHELSON.json +++ b/inst/extdata/OSD/M/MICHELSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MIDDLEMOOR.json b/inst/extdata/OSD/M/MIDDLEMOOR.json index c846812068..8787a5b18c 100644 --- a/inst/extdata/OSD/M/MIDDLEMOOR.json +++ b/inst/extdata/OSD/M/MIDDLEMOOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MIDDLERES.json b/inst/extdata/OSD/M/MIDDLERES.json index 59da82bcd9..744eecc0ee 100644 --- a/inst/extdata/OSD/M/MIDDLERES.json +++ b/inst/extdata/OSD/M/MIDDLERES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MIKE.json b/inst/extdata/OSD/M/MIKE.json index 467ada3971..b3cf8c721a 100644 --- a/inst/extdata/OSD/M/MIKE.json +++ b/inst/extdata/OSD/M/MIKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MILFORD.json b/inst/extdata/OSD/M/MILFORD.json index c8bdd04247..6818815db6 100644 --- a/inst/extdata/OSD/M/MILFORD.json +++ b/inst/extdata/OSD/M/MILFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MILK.json b/inst/extdata/OSD/M/MILK.json index 0ce8687eb4..a5dfede31a 100644 --- a/inst/extdata/OSD/M/MILK.json +++ b/inst/extdata/OSD/M/MILK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MILLERTON.json b/inst/extdata/OSD/M/MILLERTON.json index 95010ad7d5..635bfe7cba 100644 --- a/inst/extdata/OSD/M/MILLERTON.json +++ b/inst/extdata/OSD/M/MILLERTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MILLSITE.json b/inst/extdata/OSD/M/MILLSITE.json index d4e77cc953..59f2f6edea 100644 --- a/inst/extdata/OSD/M/MILLSITE.json +++ b/inst/extdata/OSD/M/MILLSITE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MILLVILLE.json b/inst/extdata/OSD/M/MILLVILLE.json index fc7b865945..1def793bc4 100644 --- a/inst/extdata/OSD/M/MILLVILLE.json +++ b/inst/extdata/OSD/M/MILLVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MILL_HOLLOW.json b/inst/extdata/OSD/M/MILL_HOLLOW.json index 9ea0d201ab..eeeefc46e0 100644 --- a/inst/extdata/OSD/M/MILL_HOLLOW.json +++ b/inst/extdata/OSD/M/MILL_HOLLOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MINA.json b/inst/extdata/OSD/M/MINA.json index 0e63a52d0b..5826e63c4d 100644 --- a/inst/extdata/OSD/M/MINA.json +++ b/inst/extdata/OSD/M/MINA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MINDEGO.json b/inst/extdata/OSD/M/MINDEGO.json index 11b74004a4..349a41f295 100644 --- a/inst/extdata/OSD/M/MINDEGO.json +++ b/inst/extdata/OSD/M/MINDEGO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MINERAL_MOUNTAIN.json b/inst/extdata/OSD/M/MINERAL_MOUNTAIN.json index e87b4e54de..c11379553c 100644 --- a/inst/extdata/OSD/M/MINERAL_MOUNTAIN.json +++ b/inst/extdata/OSD/M/MINERAL_MOUNTAIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MINNIECE.json b/inst/extdata/OSD/M/MINNIECE.json index cd986244cb..f95c36fa6e 100644 --- a/inst/extdata/OSD/M/MINNIECE.json +++ b/inst/extdata/OSD/M/MINNIECE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MINNITH.json b/inst/extdata/OSD/M/MINNITH.json index 474a54de41..63bc7f1a4a 100644 --- a/inst/extdata/OSD/M/MINNITH.json +++ b/inst/extdata/OSD/M/MINNITH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MINOCQUA.json b/inst/extdata/OSD/M/MINOCQUA.json index 610ff5e61f..5d9105cbaa 100644 --- a/inst/extdata/OSD/M/MINOCQUA.json +++ b/inst/extdata/OSD/M/MINOCQUA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MINSTER.json b/inst/extdata/OSD/M/MINSTER.json index bdcdf8f1c4..762c96c91e 100644 --- a/inst/extdata/OSD/M/MINSTER.json +++ b/inst/extdata/OSD/M/MINSTER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MINWELLS.json b/inst/extdata/OSD/M/MINWELLS.json index df18dcfbf1..5bd5d7d4c6 100644 --- a/inst/extdata/OSD/M/MINWELLS.json +++ b/inst/extdata/OSD/M/MINWELLS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MIRANDA.json b/inst/extdata/OSD/M/MIRANDA.json index 0d9d196867..d0d14e1705 100644 --- a/inst/extdata/OSD/M/MIRANDA.json +++ b/inst/extdata/OSD/M/MIRANDA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MISENHEIMER.json b/inst/extdata/OSD/M/MISENHEIMER.json index a5059c57b9..7370093564 100644 --- a/inst/extdata/OSD/M/MISENHEIMER.json +++ b/inst/extdata/OSD/M/MISENHEIMER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/M/MOANO.json b/inst/extdata/OSD/M/MOANO.json index 0e1124e2f5..d0b3db720e 100644 --- a/inst/extdata/OSD/M/MOANO.json +++ b/inst/extdata/OSD/M/MOANO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOBRIDGE.json b/inst/extdata/OSD/M/MOBRIDGE.json index 45537b05c1..a3f6bf88ee 100644 --- a/inst/extdata/OSD/M/MOBRIDGE.json +++ b/inst/extdata/OSD/M/MOBRIDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOCANE.json b/inst/extdata/OSD/M/MOCANE.json index f2f65788e3..1869383c65 100644 --- a/inst/extdata/OSD/M/MOCANE.json +++ b/inst/extdata/OSD/M/MOCANE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/M/MOCKLEY.json b/inst/extdata/OSD/M/MOCKLEY.json index 87567f04f8..f80ef7c806 100644 --- a/inst/extdata/OSD/M/MOCKLEY.json +++ b/inst/extdata/OSD/M/MOCKLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MODJESKA.json b/inst/extdata/OSD/M/MODJESKA.json index d564ae03f2..780d68bce8 100644 --- a/inst/extdata/OSD/M/MODJESKA.json +++ b/inst/extdata/OSD/M/MODJESKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MOGLIA.json b/inst/extdata/OSD/M/MOGLIA.json index c99043b155..5ccbf31c54 100644 --- a/inst/extdata/OSD/M/MOGLIA.json +++ b/inst/extdata/OSD/M/MOGLIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOHAGGIN.json b/inst/extdata/OSD/M/MOHAGGIN.json index 78334f370b..5b324a38be 100644 --- a/inst/extdata/OSD/M/MOHAGGIN.json +++ b/inst/extdata/OSD/M/MOHAGGIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOKELUMNE.json b/inst/extdata/OSD/M/MOKELUMNE.json index e03e218453..0e5dfbe0f8 100644 --- a/inst/extdata/OSD/M/MOKELUMNE.json +++ b/inst/extdata/OSD/M/MOKELUMNE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well or moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOKIAK.json b/inst/extdata/OSD/M/MOKIAK.json index e87f6ee3e0..1b455166a9 100644 --- a/inst/extdata/OSD/M/MOKIAK.json +++ b/inst/extdata/OSD/M/MOKIAK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MOKO.json b/inst/extdata/OSD/M/MOKO.json index 3e99acadaa..bbf99ec159 100644 --- a/inst/extdata/OSD/M/MOKO.json +++ b/inst/extdata/OSD/M/MOKO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MONACAN.json b/inst/extdata/OSD/M/MONACAN.json index b7cd15494a..adb884674a 100644 --- a/inst/extdata/OSD/M/MONACAN.json +++ b/inst/extdata/OSD/M/MONACAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MONAVILLE.json b/inst/extdata/OSD/M/MONAVILLE.json index 0829a7fc9e..6a6774e7ad 100644 --- a/inst/extdata/OSD/M/MONAVILLE.json +++ b/inst/extdata/OSD/M/MONAVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MONDAMIN.json b/inst/extdata/OSD/M/MONDAMIN.json index b00650d215..feb91cfed1 100644 --- a/inst/extdata/OSD/M/MONDAMIN.json +++ b/inst/extdata/OSD/M/MONDAMIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MONEE.json b/inst/extdata/OSD/M/MONEE.json index f1e72e23d6..101dbf72fa 100644 --- a/inst/extdata/OSD/M/MONEE.json +++ b/inst/extdata/OSD/M/MONEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MONON.json b/inst/extdata/OSD/M/MONON.json index ee84c366ba..5b9a151ce1 100644 --- a/inst/extdata/OSD/M/MONON.json +++ b/inst/extdata/OSD/M/MONON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MONSERATE.json b/inst/extdata/OSD/M/MONSERATE.json index da79a25372..844fc8cd96 100644 --- a/inst/extdata/OSD/M/MONSERATE.json +++ b/inst/extdata/OSD/M/MONSERATE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MONTGOMERY.json b/inst/extdata/OSD/M/MONTGOMERY.json index aedb47934d..372540790d 100644 --- a/inst/extdata/OSD/M/MONTGOMERY.json +++ b/inst/extdata/OSD/M/MONTGOMERY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MONTOUR.json b/inst/extdata/OSD/M/MONTOUR.json index 6f5815ef3a..60a6b5013a 100644 --- a/inst/extdata/OSD/M/MONTOUR.json +++ b/inst/extdata/OSD/M/MONTOUR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MONTPELLIER.json b/inst/extdata/OSD/M/MONTPELLIER.json index 1468528682..d60990cf61 100644 --- a/inst/extdata/OSD/M/MONTPELLIER.json +++ b/inst/extdata/OSD/M/MONTPELLIER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MONTSWEET.json b/inst/extdata/OSD/M/MONTSWEET.json index 11f8f1fe14..8f806d58e5 100644 --- a/inst/extdata/OSD/M/MONTSWEET.json +++ b/inst/extdata/OSD/M/MONTSWEET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively to well", - "drainage_overview": "somewhat excessively to well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MOOSE_RIVER.json b/inst/extdata/OSD/M/MOOSE_RIVER.json index bbe041a1a0..6732db68ae 100644 --- a/inst/extdata/OSD/M/MOOSE_RIVER.json +++ b/inst/extdata/OSD/M/MOOSE_RIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOOSILAUKE.json b/inst/extdata/OSD/M/MOOSILAUKE.json index d7b3b9b973..4e3cd372a1 100644 --- a/inst/extdata/OSD/M/MOOSILAUKE.json +++ b/inst/extdata/OSD/M/MOOSILAUKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOPANG.json b/inst/extdata/OSD/M/MOPANG.json index f94ab4f9dc..48e3501fbb 100644 --- a/inst/extdata/OSD/M/MOPANG.json +++ b/inst/extdata/OSD/M/MOPANG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOREAU.json b/inst/extdata/OSD/M/MOREAU.json index db8cf5c721..c209755a30 100644 --- a/inst/extdata/OSD/M/MOREAU.json +++ b/inst/extdata/OSD/M/MOREAU.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOREGLADE.json b/inst/extdata/OSD/M/MOREGLADE.json index 6dce557cec..51e7f03bbe 100644 --- a/inst/extdata/OSD/M/MOREGLADE.json +++ b/inst/extdata/OSD/M/MOREGLADE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MOREHEAD.json b/inst/extdata/OSD/M/MOREHEAD.json index ebd859f097..f1ff965b74 100644 --- a/inst/extdata/OSD/M/MOREHEAD.json +++ b/inst/extdata/OSD/M/MOREHEAD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly or moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MORET.json b/inst/extdata/OSD/M/MORET.json index 50f6316bc7..ea98a7fc08 100644 --- a/inst/extdata/OSD/M/MORET.json +++ b/inst/extdata/OSD/M/MORET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MORFITT.json b/inst/extdata/OSD/M/MORFITT.json index 489a958759..d814bc9e76 100644 --- a/inst/extdata/OSD/M/MORFITT.json +++ b/inst/extdata/OSD/M/MORFITT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOROROCK.json b/inst/extdata/OSD/M/MOROROCK.json index 99d50f05e9..3ac610cc53 100644 --- a/inst/extdata/OSD/M/MOROROCK.json +++ b/inst/extdata/OSD/M/MOROROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/M/MORRILL.json b/inst/extdata/OSD/M/MORRILL.json index 09a9b6cfec..fedb3bb5e8 100644 --- a/inst/extdata/OSD/M/MORRILL.json +++ b/inst/extdata/OSD/M/MORRILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOSHER.json b/inst/extdata/OSD/M/MOSHER.json index 540f6f1bd6..2ae81171bc 100644 --- a/inst/extdata/OSD/M/MOSHER.json +++ b/inst/extdata/OSD/M/MOSHER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOTA.json b/inst/extdata/OSD/M/MOTA.json index 31eaa9823b..5365e9fd0b 100644 --- a/inst/extdata/OSD/M/MOTA.json +++ b/inst/extdata/OSD/M/MOTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOUNDPRAIRIE.json b/inst/extdata/OSD/M/MOUNDPRAIRIE.json index cdb7e19591..9d111e3bd5 100644 --- a/inst/extdata/OSD/M/MOUNDPRAIRIE.json +++ b/inst/extdata/OSD/M/MOUNDPRAIRIE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOUNTAINVILLE.json b/inst/extdata/OSD/M/MOUNTAINVILLE.json index f5ed443dc8..d6a9417eb8 100644 --- a/inst/extdata/OSD/M/MOUNTAINVILLE.json +++ b/inst/extdata/OSD/M/MOUNTAINVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MOUNTMED.json b/inst/extdata/OSD/M/MOUNTMED.json index 306cefd46e..0a755afc7c 100644 --- a/inst/extdata/OSD/M/MOUNTMED.json +++ b/inst/extdata/OSD/M/MOUNTMED.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOUNTVIEW.json b/inst/extdata/OSD/M/MOUNTVIEW.json index 200bf690b3..9749209a8c 100644 --- a/inst/extdata/OSD/M/MOUNTVIEW.json +++ b/inst/extdata/OSD/M/MOUNTVIEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MOUNT_HOME.json b/inst/extdata/OSD/M/MOUNT_HOME.json index 92ba358011..3298531b3a 100644 --- a/inst/extdata/OSD/M/MOUNT_HOME.json +++ b/inst/extdata/OSD/M/MOUNT_HOME.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MOUNT_LUCAS.json b/inst/extdata/OSD/M/MOUNT_LUCAS.json index 08a3298d2c..78310e2088 100644 --- a/inst/extdata/OSD/M/MOUNT_LUCAS.json +++ b/inst/extdata/OSD/M/MOUNT_LUCAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MOWER.json b/inst/extdata/OSD/M/MOWER.json index 2641c98de6..2f46e5a474 100644 --- a/inst/extdata/OSD/M/MOWER.json +++ b/inst/extdata/OSD/M/MOWER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MUDDY_CREEK.json b/inst/extdata/OSD/M/MUDDY_CREEK.json index 54065e29e7..e4f4abb722 100644 --- a/inst/extdata/OSD/M/MUDDY_CREEK.json +++ b/inst/extdata/OSD/M/MUDDY_CREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MUDGEDRAW.json b/inst/extdata/OSD/M/MUDGEDRAW.json index 1163975739..adfbaff4b2 100644 --- a/inst/extdata/OSD/M/MUDGEDRAW.json +++ b/inst/extdata/OSD/M/MUDGEDRAW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MUD_SPRINGS.json b/inst/extdata/OSD/M/MUD_SPRINGS.json index 7fc3ffa87b..441308f679 100644 --- a/inst/extdata/OSD/M/MUD_SPRINGS.json +++ b/inst/extdata/OSD/M/MUD_SPRINGS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MUIR.json b/inst/extdata/OSD/M/MUIR.json index 8e364d304e..e5fe7ef5a5 100644 --- a/inst/extdata/OSD/M/MUIR.json +++ b/inst/extdata/OSD/M/MUIR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MUIRKIRK.json b/inst/extdata/OSD/M/MUIRKIRK.json index d4213e47af..e7392eada0 100644 --- a/inst/extdata/OSD/M/MUIRKIRK.json +++ b/inst/extdata/OSD/M/MUIRKIRK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/M/MULLET.json b/inst/extdata/OSD/M/MULLET.json index 96b97affec..0de1aa0e9a 100644 --- a/inst/extdata/OSD/M/MULLET.json +++ b/inst/extdata/OSD/M/MULLET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/M/MUNDOS.json b/inst/extdata/OSD/M/MUNDOS.json index ccafd3df91..f098262c53 100644 --- a/inst/extdata/OSD/M/MUNDOS.json +++ b/inst/extdata/OSD/M/MUNDOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MUNJOR.json b/inst/extdata/OSD/M/MUNJOR.json index ebfcda177d..60d08e0ded 100644 --- a/inst/extdata/OSD/M/MUNJOR.json +++ b/inst/extdata/OSD/M/MUNJOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MUNUSCONG.json b/inst/extdata/OSD/M/MUNUSCONG.json index ebf597b399..11e944d5f0 100644 --- a/inst/extdata/OSD/M/MUNUSCONG.json +++ b/inst/extdata/OSD/M/MUNUSCONG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MURAD.json b/inst/extdata/OSD/M/MURAD.json index 4786438252..32b70198e2 100644 --- a/inst/extdata/OSD/M/MURAD.json +++ b/inst/extdata/OSD/M/MURAD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/M/MURDOCK.json b/inst/extdata/OSD/M/MURDOCK.json index 2f4de0b5e8..8c8cb686de 100644 --- a/inst/extdata/OSD/M/MURDOCK.json +++ b/inst/extdata/OSD/M/MURDOCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/M/MURFREESBORO.json b/inst/extdata/OSD/M/MURFREESBORO.json index 5deb73ea29..63d3c4278d 100644 --- a/inst/extdata/OSD/M/MURFREESBORO.json +++ b/inst/extdata/OSD/M/MURFREESBORO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MURRIETA.json b/inst/extdata/OSD/M/MURRIETA.json index 0ae5acf566..5a388d232b 100644 --- a/inst/extdata/OSD/M/MURRIETA.json +++ b/inst/extdata/OSD/M/MURRIETA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/M/MUSCOTAH.json b/inst/extdata/OSD/M/MUSCOTAH.json index d716e72e46..a19056611f 100644 --- a/inst/extdata/OSD/M/MUSCOTAH.json +++ b/inst/extdata/OSD/M/MUSCOTAH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/M/MUSSEL.json b/inst/extdata/OSD/M/MUSSEL.json index 350ed39b18..66de55d1c5 100644 --- a/inst/extdata/OSD/M/MUSSEL.json +++ b/inst/extdata/OSD/M/MUSSEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/M/MUSSEY.json b/inst/extdata/OSD/M/MUSSEY.json index dd76d89c05..9de13b2942 100644 --- a/inst/extdata/OSD/M/MUSSEY.json +++ b/inst/extdata/OSD/M/MUSSEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MYAKKA.json b/inst/extdata/OSD/M/MYAKKA.json index 9be0e3aa19..754f916bde 100644 --- a/inst/extdata/OSD/M/MYAKKA.json +++ b/inst/extdata/OSD/M/MYAKKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/M/MYERS.json b/inst/extdata/OSD/M/MYERS.json index e0fa280f64..d9312f0f3b 100644 --- a/inst/extdata/OSD/M/MYERS.json +++ b/inst/extdata/OSD/M/MYERS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/M/MYSTERY.json b/inst/extdata/OSD/M/MYSTERY.json index 66c5b56330..0b53180583 100644 --- a/inst/extdata/OSD/M/MYSTERY.json +++ b/inst/extdata/OSD/M/MYSTERY.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NAGUNT.json b/inst/extdata/OSD/N/NAGUNT.json index 980e58fca1..6515ffcc87 100644 --- a/inst/extdata/OSD/N/NAGUNT.json +++ b/inst/extdata/OSD/N/NAGUNT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/N/NAHATCHE.json b/inst/extdata/OSD/N/NAHATCHE.json index 094b1ecb80..6c7d51c618 100644 --- a/inst/extdata/OSD/N/NAHATCHE.json +++ b/inst/extdata/OSD/N/NAHATCHE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/N/NAHON.json b/inst/extdata/OSD/N/NAHON.json index e438b1a7b8..c6e6c2811c 100644 --- a/inst/extdata/OSD/N/NAHON.json +++ b/inst/extdata/OSD/N/NAHON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/N/NAPA.json b/inst/extdata/OSD/N/NAPA.json index a941ebbf6b..af24cc25f3 100644 --- a/inst/extdata/OSD/N/NAPA.json +++ b/inst/extdata/OSD/N/NAPA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NAPATREE.json b/inst/extdata/OSD/N/NAPATREE.json index 1c3ecc5a57..69d903c401 100644 --- a/inst/extdata/OSD/N/NAPATREE.json +++ b/inst/extdata/OSD/N/NAPATREE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/N/NARLON.json b/inst/extdata/OSD/N/NARLON.json index 84c36b3a79..6ca63c2128 100644 --- a/inst/extdata/OSD/N/NARLON.json +++ b/inst/extdata/OSD/N/NARLON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NASKEAG.json b/inst/extdata/OSD/N/NASKEAG.json index 4d84671dc1..5c9bb40c5b 100644 --- a/inst/extdata/OSD/N/NASKEAG.json +++ b/inst/extdata/OSD/N/NASKEAG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NATURITA.json b/inst/extdata/OSD/N/NATURITA.json index 464ea96a47..d4dc719f3a 100644 --- a/inst/extdata/OSD/N/NATURITA.json +++ b/inst/extdata/OSD/N/NATURITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NAUKATI.json b/inst/extdata/OSD/N/NAUKATI.json index 829cb08338..6c8f37af61 100644 --- a/inst/extdata/OSD/N/NAUKATI.json +++ b/inst/extdata/OSD/N/NAUKATI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NAUMBURG.json b/inst/extdata/OSD/N/NAUMBURG.json index 349084fd2e..66f192fccc 100644 --- a/inst/extdata/OSD/N/NAUMBURG.json +++ b/inst/extdata/OSD/N/NAUMBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NAYPED.json b/inst/extdata/OSD/N/NAYPED.json index 0f70577163..dbb9996a83 100644 --- a/inst/extdata/OSD/N/NAYPED.json +++ b/inst/extdata/OSD/N/NAYPED.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NAZ.json b/inst/extdata/OSD/N/NAZ.json index bb9385e740..4c8ed66f11 100644 --- a/inst/extdata/OSD/N/NAZ.json +++ b/inst/extdata/OSD/N/NAZ.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/N/NEBOPEAK.json b/inst/extdata/OSD/N/NEBOPEAK.json index bb92c3275b..b5b099d673 100644 --- a/inst/extdata/OSD/N/NEBOPEAK.json +++ b/inst/extdata/OSD/N/NEBOPEAK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/N/NEESOPAH.json b/inst/extdata/OSD/N/NEESOPAH.json index ccf68d226c..4b0572805b 100644 --- a/inst/extdata/OSD/N/NEESOPAH.json +++ b/inst/extdata/OSD/N/NEESOPAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NEHAR.json b/inst/extdata/OSD/N/NEHAR.json index d265e0288e..65aa40a3ac 100644 --- a/inst/extdata/OSD/N/NEHAR.json +++ b/inst/extdata/OSD/N/NEHAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NEKOMA.json b/inst/extdata/OSD/N/NEKOMA.json index e3732096f4..f2fd48ec60 100644 --- a/inst/extdata/OSD/N/NEKOMA.json +++ b/inst/extdata/OSD/N/NEKOMA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NELMAN.json b/inst/extdata/OSD/N/NELMAN.json index be2e5abf85..afa75dffc0 100644 --- a/inst/extdata/OSD/N/NELMAN.json +++ b/inst/extdata/OSD/N/NELMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NETAWAKA.json b/inst/extdata/OSD/N/NETAWAKA.json index db482db0f0..097e9903d0 100644 --- a/inst/extdata/OSD/N/NETAWAKA.json +++ b/inst/extdata/OSD/N/NETAWAKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/N/NETTLES.json b/inst/extdata/OSD/N/NETTLES.json index 05eb3c8728..7ebb5c1cbd 100644 --- a/inst/extdata/OSD/N/NETTLES.json +++ b/inst/extdata/OSD/N/NETTLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NEVU.json b/inst/extdata/OSD/N/NEVU.json index 2f971fdd98..daa3d92304 100644 --- a/inst/extdata/OSD/N/NEVU.json +++ b/inst/extdata/OSD/N/NEVU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NEWALBIN.json b/inst/extdata/OSD/N/NEWALBIN.json index 395185dc5a..19bbd4f4b6 100644 --- a/inst/extdata/OSD/N/NEWALBIN.json +++ b/inst/extdata/OSD/N/NEWALBIN.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NEWBERN.json b/inst/extdata/OSD/N/NEWBERN.json index 3629d65b92..12c4b9fd61 100644 --- a/inst/extdata/OSD/N/NEWBERN.json +++ b/inst/extdata/OSD/N/NEWBERN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively and somewhat excessively", - "drainage_overview": "excessively and somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/N/NEWCOMER.json b/inst/extdata/OSD/N/NEWCOMER.json index 86ccaad112..46bde7079e 100644 --- a/inst/extdata/OSD/N/NEWCOMER.json +++ b/inst/extdata/OSD/N/NEWCOMER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NEWELL.json b/inst/extdata/OSD/N/NEWELL.json index a1b717a294..3cc0adae2b 100644 --- a/inst/extdata/OSD/N/NEWELL.json +++ b/inst/extdata/OSD/N/NEWELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NEWFORK.json b/inst/extdata/OSD/N/NEWFORK.json index 3bb1f15454..9027d15a8b 100644 --- a/inst/extdata/OSD/N/NEWFORK.json +++ b/inst/extdata/OSD/N/NEWFORK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NEWSON.json b/inst/extdata/OSD/N/NEWSON.json index 91fef27fd9..7768702402 100644 --- a/inst/extdata/OSD/N/NEWSON.json +++ b/inst/extdata/OSD/N/NEWSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NEWTONIA.json b/inst/extdata/OSD/N/NEWTONIA.json index b0ddd8b06b..34cf268ae3 100644 --- a/inst/extdata/OSD/N/NEWTONIA.json +++ b/inst/extdata/OSD/N/NEWTONIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NEW_CAMBRIA.json b/inst/extdata/OSD/N/NEW_CAMBRIA.json index 5ce0e1e292..853ad55986 100644 --- a/inst/extdata/OSD/N/NEW_CAMBRIA.json +++ b/inst/extdata/OSD/N/NEW_CAMBRIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/N/NEZ.json b/inst/extdata/OSD/N/NEZ.json index 8f52156454..689d4d6d15 100644 --- a/inst/extdata/OSD/N/NEZ.json +++ b/inst/extdata/OSD/N/NEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/N/NICODEMUS.json b/inst/extdata/OSD/N/NICODEMUS.json index f1cbb82ae8..18e55f39f6 100644 --- a/inst/extdata/OSD/N/NICODEMUS.json +++ b/inst/extdata/OSD/N/NICODEMUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well, moderately well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/N/NIHILL.json b/inst/extdata/OSD/N/NIHILL.json index e8f21e4eff..73dab3bfa1 100644 --- a/inst/extdata/OSD/N/NIHILL.json +++ b/inst/extdata/OSD/N/NIHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NIKLASON.json b/inst/extdata/OSD/N/NIKLASON.json index 5e2857ad65..2035125ef8 100644 --- a/inst/extdata/OSD/N/NIKLASON.json +++ b/inst/extdata/OSD/N/NIKLASON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NIKOLAI.json b/inst/extdata/OSD/N/NIKOLAI.json index 25544a8265..3cfa5e68e4 100644 --- a/inst/extdata/OSD/N/NIKOLAI.json +++ b/inst/extdata/OSD/N/NIKOLAI.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NIKWASI.json b/inst/extdata/OSD/N/NIKWASI.json index e6b897650c..3532060a50 100644 --- a/inst/extdata/OSD/N/NIKWASI.json +++ b/inst/extdata/OSD/N/NIKWASI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NILAND.json b/inst/extdata/OSD/N/NILAND.json index a2dac767cc..438dadb6b5 100644 --- a/inst/extdata/OSD/N/NILAND.json +++ b/inst/extdata/OSD/N/NILAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NIMBRO.json b/inst/extdata/OSD/N/NIMBRO.json index 6029717f7e..dffa5f3760 100644 --- a/inst/extdata/OSD/N/NIMBRO.json +++ b/inst/extdata/OSD/N/NIMBRO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NIMERICK.json b/inst/extdata/OSD/N/NIMERICK.json index 60048a96ba..b123e8befe 100644 --- a/inst/extdata/OSD/N/NIMERICK.json +++ b/inst/extdata/OSD/N/NIMERICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NIMROD.json b/inst/extdata/OSD/N/NIMROD.json index 1932de6ac0..18d9af3578 100644 --- a/inst/extdata/OSD/N/NIMROD.json +++ b/inst/extdata/OSD/N/NIMROD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/N/NINEKAR.json b/inst/extdata/OSD/N/NINEKAR.json index a06683af41..a77a8cfaf6 100644 --- a/inst/extdata/OSD/N/NINEKAR.json +++ b/inst/extdata/OSD/N/NINEKAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/N/NIOBELL.json b/inst/extdata/OSD/N/NIOBELL.json index adf3d6b480..3ab90f595e 100644 --- a/inst/extdata/OSD/N/NIOBELL.json +++ b/inst/extdata/OSD/N/NIOBELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NIPSUM.json b/inst/extdata/OSD/N/NIPSUM.json index 89294b87af..e35221cb6d 100644 --- a/inst/extdata/OSD/N/NIPSUM.json +++ b/inst/extdata/OSD/N/NIPSUM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NISHNA.json b/inst/extdata/OSD/N/NISHNA.json index 57f348de9e..2e342c5df9 100644 --- a/inst/extdata/OSD/N/NISHNA.json +++ b/inst/extdata/OSD/N/NISHNA.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NIWOT.json b/inst/extdata/OSD/N/NIWOT.json index 23de5db10b..c25c7baa39 100644 --- a/inst/extdata/OSD/N/NIWOT.json +++ b/inst/extdata/OSD/N/NIWOT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NIZINA.json b/inst/extdata/OSD/N/NIZINA.json index 5e0fb2fa63..4338ba54d5 100644 --- a/inst/extdata/OSD/N/NIZINA.json +++ b/inst/extdata/OSD/N/NIZINA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/N/NOAGUA.json b/inst/extdata/OSD/N/NOAGUA.json index 354d0cf800..6ca573b3dd 100644 --- a/inst/extdata/OSD/N/NOAGUA.json +++ b/inst/extdata/OSD/N/NOAGUA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/N/NOHOPE.json b/inst/extdata/OSD/N/NOHOPE.json index 658740be1b..9cf69295c4 100644 --- a/inst/extdata/OSD/N/NOHOPE.json +++ b/inst/extdata/OSD/N/NOHOPE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NOISY.json b/inst/extdata/OSD/N/NOISY.json index c69b63dec4..02b6d6a22e 100644 --- a/inst/extdata/OSD/N/NOISY.json +++ b/inst/extdata/OSD/N/NOISY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NOKHU.json b/inst/extdata/OSD/N/NOKHU.json index 5ce29a5675..435fd55b42 100644 --- a/inst/extdata/OSD/N/NOKHU.json +++ b/inst/extdata/OSD/N/NOKHU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NOONAN.json b/inst/extdata/OSD/N/NOONAN.json index 78cead0d1d..8b6824ea62 100644 --- a/inst/extdata/OSD/N/NOONAN.json +++ b/inst/extdata/OSD/N/NOONAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NOONKU.json b/inst/extdata/OSD/N/NOONKU.json index b617eece8f..a24059651d 100644 --- a/inst/extdata/OSD/N/NOONKU.json +++ b/inst/extdata/OSD/N/NOONKU.json @@ -65,7 +65,7 @@ [ { "drainage": "very poorly", - "drainage_overview": "" + "drainage_overview": "very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NOPAH.json b/inst/extdata/OSD/N/NOPAH.json index ad7cbd7274..9984b67618 100644 --- a/inst/extdata/OSD/N/NOPAH.json +++ b/inst/extdata/OSD/N/NOPAH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/N/NORAD.json b/inst/extdata/OSD/N/NORAD.json index 7f356a6d1a..f49e0e898b 100644 --- a/inst/extdata/OSD/N/NORAD.json +++ b/inst/extdata/OSD/N/NORAD.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NORCHIP.json b/inst/extdata/OSD/N/NORCHIP.json index abbd500e3e..a415617611 100644 --- a/inst/extdata/OSD/N/NORCHIP.json +++ b/inst/extdata/OSD/N/NORCHIP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NORENE.json b/inst/extdata/OSD/N/NORENE.json index 0a8a6db65a..3caf729466 100644 --- a/inst/extdata/OSD/N/NORENE.json +++ b/inst/extdata/OSD/N/NORENE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/N/NORTE.json b/inst/extdata/OSD/N/NORTE.json index e765008a2d..caf5f6dbe2 100644 --- a/inst/extdata/OSD/N/NORTE.json +++ b/inst/extdata/OSD/N/NORTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/N/NORTHCOTE.json b/inst/extdata/OSD/N/NORTHCOTE.json index d56d0fc7f7..3a3cd1f2b7 100644 --- a/inst/extdata/OSD/N/NORTHCOTE.json +++ b/inst/extdata/OSD/N/NORTHCOTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NORWAY.json b/inst/extdata/OSD/N/NORWAY.json index abb39a33f0..9d94697b3b 100644 --- a/inst/extdata/OSD/N/NORWAY.json +++ b/inst/extdata/OSD/N/NORWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NORWAY_FLAT.json b/inst/extdata/OSD/N/NORWAY_FLAT.json index dbf313b99e..bb5c0ecf8f 100644 --- a/inst/extdata/OSD/N/NORWAY_FLAT.json +++ b/inst/extdata/OSD/N/NORWAY_FLAT.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "well to somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/N/NORWICH.json b/inst/extdata/OSD/N/NORWICH.json index a8ccd7a601..5b0cfd4e02 100644 --- a/inst/extdata/OSD/N/NORWICH.json +++ b/inst/extdata/OSD/N/NORWICH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NOTOM.json b/inst/extdata/OSD/N/NOTOM.json index bbdbecf8bf..12fbc1df06 100644 --- a/inst/extdata/OSD/N/NOTOM.json +++ b/inst/extdata/OSD/N/NOTOM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or excessively", - "drainage_overview": "somewhat excessively to excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/N/NOTUS.json b/inst/extdata/OSD/N/NOTUS.json index a62b0afe2b..fe1e0cfd4f 100644 --- a/inst/extdata/OSD/N/NOTUS.json +++ b/inst/extdata/OSD/N/NOTUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/N/NOWHERE.json b/inst/extdata/OSD/N/NOWHERE.json index b816cfbadf..de8f47ab6c 100644 --- a/inst/extdata/OSD/N/NOWHERE.json +++ b/inst/extdata/OSD/N/NOWHERE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NOXVILLE.json b/inst/extdata/OSD/N/NOXVILLE.json index 3d8c53c78a..6c61e6a7b4 100644 --- a/inst/extdata/OSD/N/NOXVILLE.json +++ b/inst/extdata/OSD/N/NOXVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/N/NOYES.json b/inst/extdata/OSD/N/NOYES.json index f925201b72..7a077718c3 100644 --- a/inst/extdata/OSD/N/NOYES.json +++ b/inst/extdata/OSD/N/NOYES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/N/NUNICA.json b/inst/extdata/OSD/N/NUNICA.json index 4327054234..b37de35df7 100644 --- a/inst/extdata/OSD/N/NUNICA.json +++ b/inst/extdata/OSD/N/NUNICA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/N/NUTALL.json b/inst/extdata/OSD/N/NUTALL.json index d71da64b0a..f088479d4c 100644 --- a/inst/extdata/OSD/N/NUTALL.json +++ b/inst/extdata/OSD/N/NUTALL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/N/NUTMEG.json b/inst/extdata/OSD/N/NUTMEG.json index 2fbcedb79a..36ee9ff39b 100644 --- a/inst/extdata/OSD/N/NUTMEG.json +++ b/inst/extdata/OSD/N/NUTMEG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/N/NUTRIOSO.json b/inst/extdata/OSD/N/NUTRIOSO.json index 0177a3da46..2b066f818f 100644 --- a/inst/extdata/OSD/N/NUTRIOSO.json +++ b/inst/extdata/OSD/N/NUTRIOSO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OAKALLA.json b/inst/extdata/OSD/O/OAKALLA.json index 1ad73a6e70..4a956f9a81 100644 --- a/inst/extdata/OSD/O/OAKALLA.json +++ b/inst/extdata/OSD/O/OAKALLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OAKBORO.json b/inst/extdata/OSD/O/OAKBORO.json index fdfe0f4738..4cb5f6609d 100644 --- a/inst/extdata/OSD/O/OAKBORO.json +++ b/inst/extdata/OSD/O/OAKBORO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/O/OAKDEN.json b/inst/extdata/OSD/O/OAKDEN.json index 07da246c13..0baa2c0f74 100644 --- a/inst/extdata/OSD/O/OAKDEN.json +++ b/inst/extdata/OSD/O/OAKDEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OAK_GROVE.json b/inst/extdata/OSD/O/OAK_GROVE.json index 8cb1e0f9f2..8e4fc4a153 100644 --- a/inst/extdata/OSD/O/OAK_GROVE.json +++ b/inst/extdata/OSD/O/OAK_GROVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OBAN.json b/inst/extdata/OSD/O/OBAN.json index 74ef75b2f5..9f7ac7be38 100644 --- a/inst/extdata/OSD/O/OBAN.json +++ b/inst/extdata/OSD/O/OBAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/OBERT.json b/inst/extdata/OSD/O/OBERT.json index ae9195e04e..ab68307094 100644 --- a/inst/extdata/OSD/O/OBERT.json +++ b/inst/extdata/OSD/O/OBERT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/O/OBRAST.json b/inst/extdata/OSD/O/OBRAST.json index 299110b00c..cdb164e74c 100644 --- a/inst/extdata/OSD/O/OBRAST.json +++ b/inst/extdata/OSD/O/OBRAST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/OBRAY.json b/inst/extdata/OSD/O/OBRAY.json index 6571356357..51691ccabf 100644 --- a/inst/extdata/OSD/O/OBRAY.json +++ b/inst/extdata/OSD/O/OBRAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/OCCOQUAN.json b/inst/extdata/OSD/O/OCCOQUAN.json index a12dbfccbe..662ef7ccb8 100644 --- a/inst/extdata/OSD/O/OCCOQUAN.json +++ b/inst/extdata/OSD/O/OCCOQUAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/OCHILTREE.json b/inst/extdata/OSD/O/OCHILTREE.json index 79074fb6e5..7d2ebe9f6a 100644 --- a/inst/extdata/OSD/O/OCHILTREE.json +++ b/inst/extdata/OSD/O/OCHILTREE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/O/OCQUEOC.json b/inst/extdata/OSD/O/OCQUEOC.json index 55ee3958fe..f9398cd6c1 100644 --- a/inst/extdata/OSD/O/OCQUEOC.json +++ b/inst/extdata/OSD/O/OCQUEOC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/ODO.json b/inst/extdata/OSD/O/ODO.json index 99abee715e..acb9d1598e 100644 --- a/inst/extdata/OSD/O/ODO.json +++ b/inst/extdata/OSD/O/ODO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OGLALA.json b/inst/extdata/OSD/O/OGLALA.json index 27e36834d3..40b4a7e813 100644 --- a/inst/extdata/OSD/O/OGLALA.json +++ b/inst/extdata/OSD/O/OGLALA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/OHMAN.json b/inst/extdata/OSD/O/OHMAN.json index 5a93a507e0..a206cb405d 100644 --- a/inst/extdata/OSD/O/OHMAN.json +++ b/inst/extdata/OSD/O/OHMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OJINAGA.json b/inst/extdata/OSD/O/OJINAGA.json index addb5a3c8c..ab70e1f0dd 100644 --- a/inst/extdata/OSD/O/OJINAGA.json +++ b/inst/extdata/OSD/O/OJINAGA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OKEE.json b/inst/extdata/OSD/O/OKEE.json index acf0874b9c..dc63fa1019 100644 --- a/inst/extdata/OSD/O/OKEE.json +++ b/inst/extdata/OSD/O/OKEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/OLDALE.json b/inst/extdata/OSD/O/OLDALE.json index 082d2de2b8..92d48842cb 100644 --- a/inst/extdata/OSD/O/OLDALE.json +++ b/inst/extdata/OSD/O/OLDALE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/OLDSMAR.json b/inst/extdata/OSD/O/OLDSMAR.json index 94150af662..b505579ad2 100644 --- a/inst/extdata/OSD/O/OLDSMAR.json +++ b/inst/extdata/OSD/O/OLDSMAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/O/OLDWOMAN.json b/inst/extdata/OSD/O/OLDWOMAN.json index cefb584703..50d5dcae19 100644 --- a/inst/extdata/OSD/O/OLDWOMAN.json +++ b/inst/extdata/OSD/O/OLDWOMAN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/OLIVENHAIN.json b/inst/extdata/OSD/O/OLIVENHAIN.json index 32094c5a63..db4e00e292 100644 --- a/inst/extdata/OSD/O/OLIVENHAIN.json +++ b/inst/extdata/OSD/O/OLIVENHAIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/OLSON.json b/inst/extdata/OSD/O/OLSON.json index 4b01f88bb3..25c23d2157 100644 --- a/inst/extdata/OSD/O/OLSON.json +++ b/inst/extdata/OSD/O/OLSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OMIO.json b/inst/extdata/OSD/O/OMIO.json index 55471c0236..5ba64caa51 100644 --- a/inst/extdata/OSD/O/OMIO.json +++ b/inst/extdata/OSD/O/OMIO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/OMSTOTT.json b/inst/extdata/OSD/O/OMSTOTT.json index 1dcb346428..7fa47be35c 100644 --- a/inst/extdata/OSD/O/OMSTOTT.json +++ b/inst/extdata/OSD/O/OMSTOTT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/ONAWAY.json b/inst/extdata/OSD/O/ONAWAY.json index 60615e82c4..d51b870f9c 100644 --- a/inst/extdata/OSD/O/ONAWAY.json +++ b/inst/extdata/OSD/O/ONAWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/ONIONPIE.json b/inst/extdata/OSD/O/ONIONPIE.json index 19a90607d7..f48cd69ad9 100644 --- a/inst/extdata/OSD/O/ONIONPIE.json +++ b/inst/extdata/OSD/O/ONIONPIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/O/ONITA.json b/inst/extdata/OSD/O/ONITA.json index da163f026e..17b637854e 100644 --- a/inst/extdata/OSD/O/ONITA.json +++ b/inst/extdata/OSD/O/ONITA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/ONOTA.json b/inst/extdata/OSD/O/ONOTA.json index 37163b396b..90d6abf921 100644 --- a/inst/extdata/OSD/O/ONOTA.json +++ b/inst/extdata/OSD/O/ONOTA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/ONSLOW.json b/inst/extdata/OSD/O/ONSLOW.json index 81c78b8da7..c494e70359 100644 --- a/inst/extdata/OSD/O/ONSLOW.json +++ b/inst/extdata/OSD/O/ONSLOW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/O/ONTKO.json b/inst/extdata/OSD/O/ONTKO.json index 17ae5a0da9..51d47ade5c 100644 --- a/inst/extdata/OSD/O/ONTKO.json +++ b/inst/extdata/OSD/O/ONTKO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/O/ONYX.json b/inst/extdata/OSD/O/ONYX.json index f7a2d60e4a..005b25315b 100644 --- a/inst/extdata/OSD/O/ONYX.json +++ b/inst/extdata/OSD/O/ONYX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OPOLIS.json b/inst/extdata/OSD/O/OPOLIS.json index 3200170b5e..49ef68a3f3 100644 --- a/inst/extdata/OSD/O/OPOLIS.json +++ b/inst/extdata/OSD/O/OPOLIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/O/OQUAGA.json b/inst/extdata/OSD/O/OQUAGA.json index 3ebfb32f71..619ff7cedf 100644 --- a/inst/extdata/OSD/O/OQUAGA.json +++ b/inst/extdata/OSD/O/OQUAGA.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/ORACLEOAK.json b/inst/extdata/OSD/O/ORACLEOAK.json index 84e5aa4327..08807a9a61 100644 --- a/inst/extdata/OSD/O/ORACLEOAK.json +++ b/inst/extdata/OSD/O/ORACLEOAK.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/ORANGE.json b/inst/extdata/OSD/O/ORANGE.json index 5987d5bbff..f82749810f 100644 --- a/inst/extdata/OSD/O/ORANGE.json +++ b/inst/extdata/OSD/O/ORANGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/O/ORDNANCE.json b/inst/extdata/OSD/O/ORDNANCE.json index cc021744fc..af469ed316 100644 --- a/inst/extdata/OSD/O/ORDNANCE.json +++ b/inst/extdata/OSD/O/ORDNANCE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/ORIO.json b/inst/extdata/OSD/O/ORIO.json index 27a6157f6d..e7ef6a1070 100644 --- a/inst/extdata/OSD/O/ORIO.json +++ b/inst/extdata/OSD/O/ORIO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/O/ORIZABA.json b/inst/extdata/OSD/O/ORIZABA.json index 439220cea5..d0bc31aa9c 100644 --- a/inst/extdata/OSD/O/ORIZABA.json +++ b/inst/extdata/OSD/O/ORIZABA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/O/ORPHA.json b/inst/extdata/OSD/O/ORPHA.json index 0896b4ab09..28315264f0 100644 --- a/inst/extdata/OSD/O/ORPHA.json +++ b/inst/extdata/OSD/O/ORPHA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/O/ORSA.json b/inst/extdata/OSD/O/ORSA.json index 25bfecc60a..749d9dcc4e 100644 --- a/inst/extdata/OSD/O/ORSA.json +++ b/inst/extdata/OSD/O/ORSA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/ORUPA.json b/inst/extdata/OSD/O/ORUPA.json index 942550c89a..4edde4ecc8 100644 --- a/inst/extdata/OSD/O/ORUPA.json +++ b/inst/extdata/OSD/O/ORUPA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/O/OSKAWALIKFAMILY.json b/inst/extdata/OSD/O/OSKAWALIKFAMILY.json index 800d2b6b2a..490496ff68 100644 --- a/inst/extdata/OSD/O/OSKAWALIKFAMILY.json +++ b/inst/extdata/OSD/O/OSKAWALIKFAMILY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "very poorly to poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/O/OSMUND.json b/inst/extdata/OSD/O/OSMUND.json index 4605c44e46..8d42f0ad5b 100644 --- a/inst/extdata/OSD/O/OSMUND.json +++ b/inst/extdata/OSD/O/OSMUND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/O/OSOTE.json b/inst/extdata/OSD/O/OSOTE.json index 11078d1e1a..972d8ad8d5 100644 --- a/inst/extdata/OSD/O/OSOTE.json +++ b/inst/extdata/OSD/O/OSOTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OSTIN.json b/inst/extdata/OSD/O/OSTIN.json index 5fb9cb5fc2..e8326c205a 100644 --- a/inst/extdata/OSD/O/OSTIN.json +++ b/inst/extdata/OSD/O/OSTIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/OTERO.json b/inst/extdata/OSD/O/OTERO.json index 3c7cd104c0..d5d790b3a4 100644 --- a/inst/extdata/OSD/O/OTERO.json +++ b/inst/extdata/OSD/O/OTERO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/O/OTOE.json b/inst/extdata/OSD/O/OTOE.json index b9eb273e54..c176297cc6 100644 --- a/inst/extdata/OSD/O/OTOE.json +++ b/inst/extdata/OSD/O/OTOE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/O/OTTER.json b/inst/extdata/OSD/O/OTTER.json index 984e1e5628..3c018f1fcc 100644 --- a/inst/extdata/OSD/O/OTTER.json +++ b/inst/extdata/OSD/O/OTTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/O/OURAY.json b/inst/extdata/OSD/O/OURAY.json index cb5e8e802e..3e775bd354 100644 --- a/inst/extdata/OSD/O/OURAY.json +++ b/inst/extdata/OSD/O/OURAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OVERBOARD.json b/inst/extdata/OSD/O/OVERBOARD.json index e05529aff2..bc49f963c4 100644 --- a/inst/extdata/OSD/O/OVERBOARD.json +++ b/inst/extdata/OSD/O/OVERBOARD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/O/OVERLAND.json b/inst/extdata/OSD/O/OVERLAND.json index 4e6b12a9a8..a67ab0d961 100644 --- a/inst/extdata/OSD/O/OVERLAND.json +++ b/inst/extdata/OSD/O/OVERLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OVERLY.json b/inst/extdata/OSD/O/OVERLY.json index e84c7a2ffd..a03e6e329f 100644 --- a/inst/extdata/OSD/O/OVERLY.json +++ b/inst/extdata/OSD/O/OVERLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/O/OWYHEE.json b/inst/extdata/OSD/O/OWYHEE.json index 4cf08240ac..b261c69b40 100644 --- a/inst/extdata/OSD/O/OWYHEE.json +++ b/inst/extdata/OSD/O/OWYHEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/O/OYSTERLAKE.json b/inst/extdata/OSD/O/OYSTERLAKE.json index 3646acf685..8c3d92becf 100644 --- a/inst/extdata/OSD/O/OYSTERLAKE.json +++ b/inst/extdata/OSD/O/OYSTERLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PACHECO.json b/inst/extdata/OSD/P/PACHECO.json index 263bdcb315..13bbb80e43 100644 --- a/inst/extdata/OSD/P/PACHECO.json +++ b/inst/extdata/OSD/P/PACHECO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/PACKWOOD.json b/inst/extdata/OSD/P/PACKWOOD.json index b56ee33297..cf3973da69 100644 --- a/inst/extdata/OSD/P/PACKWOOD.json +++ b/inst/extdata/OSD/P/PACKWOOD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PACTOLUS.json b/inst/extdata/OSD/P/PACTOLUS.json index 84432e6449..26066a44ad 100644 --- a/inst/extdata/OSD/P/PACTOLUS.json +++ b/inst/extdata/OSD/P/PACTOLUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PADDYKNOB.json b/inst/extdata/OSD/P/PADDYKNOB.json index 3a5b1c42b9..bab542f0fa 100644 --- a/inst/extdata/OSD/P/PADDYKNOB.json +++ b/inst/extdata/OSD/P/PADDYKNOB.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PADONIA.json b/inst/extdata/OSD/P/PADONIA.json index c88d40373b..f7275aed06 100644 --- a/inst/extdata/OSD/P/PADONIA.json +++ b/inst/extdata/OSD/P/PADONIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PAGOSA.json b/inst/extdata/OSD/P/PAGOSA.json index d9babc6c63..476263ac0f 100644 --- a/inst/extdata/OSD/P/PAGOSA.json +++ b/inst/extdata/OSD/P/PAGOSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PAHRANAGAT.json b/inst/extdata/OSD/P/PAHRANAGAT.json index 417c68d5d9..663e8287fb 100644 --- a/inst/extdata/OSD/P/PAHRANAGAT.json +++ b/inst/extdata/OSD/P/PAHRANAGAT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PAICE.json b/inst/extdata/OSD/P/PAICE.json index bdaf65c4a7..66f5bece7f 100644 --- a/inst/extdata/OSD/P/PAICE.json +++ b/inst/extdata/OSD/P/PAICE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PALATINE.json b/inst/extdata/OSD/P/PALATINE.json index 4626a60d8e..afa5e5c616 100644 --- a/inst/extdata/OSD/P/PALATINE.json +++ b/inst/extdata/OSD/P/PALATINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PALMA.json b/inst/extdata/OSD/P/PALMA.json index 2388c07334..6fd4da01f7 100644 --- a/inst/extdata/OSD/P/PALMA.json +++ b/inst/extdata/OSD/P/PALMA.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "well and somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PALMER_CANYON.json b/inst/extdata/OSD/P/PALMER_CANYON.json index 4af025a92b..1aa328f0bc 100644 --- a/inst/extdata/OSD/P/PALMER_CANYON.json +++ b/inst/extdata/OSD/P/PALMER_CANYON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PALMYRA.json b/inst/extdata/OSD/P/PALMYRA.json index f2165954c0..ed5efc63f7 100644 --- a/inst/extdata/OSD/P/PALMYRA.json +++ b/inst/extdata/OSD/P/PALMYRA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PALM_BEACH.json b/inst/extdata/OSD/P/PALM_BEACH.json index 83b0ef2398..18b9812f98 100644 --- a/inst/extdata/OSD/P/PALM_BEACH.json +++ b/inst/extdata/OSD/P/PALM_BEACH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PALOMAS.json b/inst/extdata/OSD/P/PALOMAS.json index 4f1aab199f..fe2c7f5a04 100644 --- a/inst/extdata/OSD/P/PALOMAS.json +++ b/inst/extdata/OSD/P/PALOMAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PALOMINO.json b/inst/extdata/OSD/P/PALOMINO.json index e0a5d6ef5f..c412c7a5f7 100644 --- a/inst/extdata/OSD/P/PALOMINO.json +++ b/inst/extdata/OSD/P/PALOMINO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PANDO.json b/inst/extdata/OSD/P/PANDO.json index a464bb67e3..b84ede418a 100644 --- a/inst/extdata/OSD/P/PANDO.json +++ b/inst/extdata/OSD/P/PANDO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PANDOAH.json b/inst/extdata/OSD/P/PANDOAH.json index bb7d826a93..bd9540a6f5 100644 --- a/inst/extdata/OSD/P/PANDOAH.json +++ b/inst/extdata/OSD/P/PANDOAH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PANIN.json b/inst/extdata/OSD/P/PANIN.json index d6fbcf6fee..ea1415c767 100644 --- a/inst/extdata/OSD/P/PANIN.json +++ b/inst/extdata/OSD/P/PANIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PANSEY.json b/inst/extdata/OSD/P/PANSEY.json index 170525f013..42a23d6694 100644 --- a/inst/extdata/OSD/P/PANSEY.json +++ b/inst/extdata/OSD/P/PANSEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PANTON.json b/inst/extdata/OSD/P/PANTON.json index 0f44ebccf3..2064c70cab 100644 --- a/inst/extdata/OSD/P/PANTON.json +++ b/inst/extdata/OSD/P/PANTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/PAOLI.json b/inst/extdata/OSD/P/PAOLI.json index 226381d74c..111d4a54f7 100644 --- a/inst/extdata/OSD/P/PAOLI.json +++ b/inst/extdata/OSD/P/PAOLI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PARENT.json b/inst/extdata/OSD/P/PARENT.json index 23793a01d5..d8416df8de 100644 --- a/inst/extdata/OSD/P/PARENT.json +++ b/inst/extdata/OSD/P/PARENT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PARKALLEY.json b/inst/extdata/OSD/P/PARKALLEY.json index 7f455936e2..6c2c7aa7ce 100644 --- a/inst/extdata/OSD/P/PARKALLEY.json +++ b/inst/extdata/OSD/P/PARKALLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PARKFIELD.json b/inst/extdata/OSD/P/PARKFIELD.json index 71fe561292..951ab15128 100644 --- a/inst/extdata/OSD/P/PARKFIELD.json +++ b/inst/extdata/OSD/P/PARKFIELD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PARKHILL.json b/inst/extdata/OSD/P/PARKHILL.json index 0edf330495..0b2d519656 100644 --- a/inst/extdata/OSD/P/PARKHILL.json +++ b/inst/extdata/OSD/P/PARKHILL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PARLEYS.json b/inst/extdata/OSD/P/PARLEYS.json index dd02b41b10..8a497d4939 100644 --- a/inst/extdata/OSD/P/PARLEYS.json +++ b/inst/extdata/OSD/P/PARLEYS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PARNELL.json b/inst/extdata/OSD/P/PARNELL.json index ddf5838ca7..c21fc496b0 100644 --- a/inst/extdata/OSD/P/PARNELL.json +++ b/inst/extdata/OSD/P/PARNELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PAROHTOG.json b/inst/extdata/OSD/P/PAROHTOG.json index ba524594de..a68e607504 100644 --- a/inst/extdata/OSD/P/PAROHTOG.json +++ b/inst/extdata/OSD/P/PAROHTOG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PARRISH.json b/inst/extdata/OSD/P/PARRISH.json index 99bf6cfd7f..f134e6b952 100644 --- a/inst/extdata/OSD/P/PARRISH.json +++ b/inst/extdata/OSD/P/PARRISH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PARSHALL.json b/inst/extdata/OSD/P/PARSHALL.json index ac8368acc1..b70a6f9412 100644 --- a/inst/extdata/OSD/P/PARSHALL.json +++ b/inst/extdata/OSD/P/PARSHALL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PARTOFSHIKOF.json b/inst/extdata/OSD/P/PARTOFSHIKOF.json index 1ad5a3db34..cda5c23f57 100644 --- a/inst/extdata/OSD/P/PARTOFSHIKOF.json +++ b/inst/extdata/OSD/P/PARTOFSHIKOF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PARTOV.json b/inst/extdata/OSD/P/PARTOV.json index 290ec3a852..04f3d36407 100644 --- a/inst/extdata/OSD/P/PARTOV.json +++ b/inst/extdata/OSD/P/PARTOV.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PARTRI.json b/inst/extdata/OSD/P/PARTRI.json index 842248b366..9de0b1718a 100644 --- a/inst/extdata/OSD/P/PARTRI.json +++ b/inst/extdata/OSD/P/PARTRI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PASCACK.json b/inst/extdata/OSD/P/PASCACK.json index 799b03a534..9da9d58cd4 100644 --- a/inst/extdata/OSD/P/PASCACK.json +++ b/inst/extdata/OSD/P/PASCACK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PASCO.json b/inst/extdata/OSD/P/PASCO.json index aa06d6b4b1..59f279387e 100644 --- a/inst/extdata/OSD/P/PASCO.json +++ b/inst/extdata/OSD/P/PASCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PASQUETTI.json b/inst/extdata/OSD/P/PASQUETTI.json index 8a5b7a03fb..1758dbd4fb 100644 --- a/inst/extdata/OSD/P/PASQUETTI.json +++ b/inst/extdata/OSD/P/PASQUETTI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PASS_CANYON.json b/inst/extdata/OSD/P/PASS_CANYON.json index 20c205f8a8..4bd6f00278 100644 --- a/inst/extdata/OSD/P/PASS_CANYON.json +++ b/inst/extdata/OSD/P/PASS_CANYON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PASTURECREEK.json b/inst/extdata/OSD/P/PASTURECREEK.json index 91bd01e086..b3d31c6857 100644 --- a/inst/extdata/OSD/P/PASTURECREEK.json +++ b/inst/extdata/OSD/P/PASTURECREEK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PASTURE_POINT.json b/inst/extdata/OSD/P/PASTURE_POINT.json index f73538de02..ca82d68574 100644 --- a/inst/extdata/OSD/P/PASTURE_POINT.json +++ b/inst/extdata/OSD/P/PASTURE_POINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/P/PATE.json b/inst/extdata/OSD/P/PATE.json index 1c2a6dad94..e0ac7e0682 100644 --- a/inst/extdata/OSD/P/PATE.json +++ b/inst/extdata/OSD/P/PATE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PATILO.json b/inst/extdata/OSD/P/PATILO.json index 779f255f75..c5d346c808 100644 --- a/inst/extdata/OSD/P/PATILO.json +++ b/inst/extdata/OSD/P/PATILO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PATRICK.json b/inst/extdata/OSD/P/PATRICK.json index 3a8e2cf94d..1ecff54a16 100644 --- a/inst/extdata/OSD/P/PATRICK.json +++ b/inst/extdata/OSD/P/PATRICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PATTON.json b/inst/extdata/OSD/P/PATTON.json index 37799cf3e8..88987bcff8 100644 --- a/inst/extdata/OSD/P/PATTON.json +++ b/inst/extdata/OSD/P/PATTON.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PAULSON.json b/inst/extdata/OSD/P/PAULSON.json index d3480fb3f6..10f79c8d80 100644 --- a/inst/extdata/OSD/P/PAULSON.json +++ b/inst/extdata/OSD/P/PAULSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PAVANT.json b/inst/extdata/OSD/P/PAVANT.json index a53990fe93..6188483f05 100644 --- a/inst/extdata/OSD/P/PAVANT.json +++ b/inst/extdata/OSD/P/PAVANT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PAVILLION.json b/inst/extdata/OSD/P/PAVILLION.json index dc57f751eb..2c347ec35b 100644 --- a/inst/extdata/OSD/P/PAVILLION.json +++ b/inst/extdata/OSD/P/PAVILLION.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PAXICO.json b/inst/extdata/OSD/P/PAXICO.json index c6527cefb5..722f115d49 100644 --- a/inst/extdata/OSD/P/PAXICO.json +++ b/inst/extdata/OSD/P/PAXICO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/P/PAYRAISE.json b/inst/extdata/OSD/P/PAYRAISE.json index 7f13883d66..650196010a 100644 --- a/inst/extdata/OSD/P/PAYRAISE.json +++ b/inst/extdata/OSD/P/PAYRAISE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PAYSON.json b/inst/extdata/OSD/P/PAYSON.json index 0f8eb2ff4b..390ac33ae7 100644 --- a/inst/extdata/OSD/P/PAYSON.json +++ b/inst/extdata/OSD/P/PAYSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PEAKED.json b/inst/extdata/OSD/P/PEAKED.json index 719a7eeea1..9113f355c9 100644 --- a/inst/extdata/OSD/P/PEAKED.json +++ b/inst/extdata/OSD/P/PEAKED.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "moderately well", + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PEAVY.json b/inst/extdata/OSD/P/PEAVY.json index 7a60231dd5..f4b9ed5e5d 100644 --- a/inst/extdata/OSD/P/PEAVY.json +++ b/inst/extdata/OSD/P/PEAVY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PEDLEFORD.json b/inst/extdata/OSD/P/PEDLEFORD.json index 6b53e1a454..41b6381360 100644 --- a/inst/extdata/OSD/P/PEDLEFORD.json +++ b/inst/extdata/OSD/P/PEDLEFORD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PEDRICK.json b/inst/extdata/OSD/P/PEDRICK.json index 9ea3af9b85..dca22c2022 100644 --- a/inst/extdata/OSD/P/PEDRICK.json +++ b/inst/extdata/OSD/P/PEDRICK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PEMBERTON.json b/inst/extdata/OSD/P/PEMBERTON.json index 0d6d2b412d..93e9eef7f9 100644 --- a/inst/extdata/OSD/P/PEMBERTON.json +++ b/inst/extdata/OSD/P/PEMBERTON.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PENDANT.json b/inst/extdata/OSD/P/PENDANT.json index 255e192996..c68fbaa5a3 100644 --- a/inst/extdata/OSD/P/PENDANT.json +++ b/inst/extdata/OSD/P/PENDANT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PENDER.json b/inst/extdata/OSD/P/PENDER.json index 35615c94d7..6a5d1e2f55 100644 --- a/inst/extdata/OSD/P/PENDER.json +++ b/inst/extdata/OSD/P/PENDER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PENDERGRASS.json b/inst/extdata/OSD/P/PENDERGRASS.json index 8c35b21883..fbaee860dd 100644 --- a/inst/extdata/OSD/P/PENDERGRASS.json +++ b/inst/extdata/OSD/P/PENDERGRASS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PENNSUCO.json b/inst/extdata/OSD/P/PENNSUCO.json index 58b6cc5da0..f82d50c202 100644 --- a/inst/extdata/OSD/P/PENNSUCO.json +++ b/inst/extdata/OSD/P/PENNSUCO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PENROSE.json b/inst/extdata/OSD/P/PENROSE.json index ec50088d8c..f6dde2c789 100644 --- a/inst/extdata/OSD/P/PENROSE.json +++ b/inst/extdata/OSD/P/PENROSE.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "well and somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PERCY.json b/inst/extdata/OSD/P/PERCY.json index 372ec92c75..4753500b73 100644 --- a/inst/extdata/OSD/P/PERCY.json +++ b/inst/extdata/OSD/P/PERCY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PERITSA.json b/inst/extdata/OSD/P/PERITSA.json index 3196f61905..1dba6e205e 100644 --- a/inst/extdata/OSD/P/PERITSA.json +++ b/inst/extdata/OSD/P/PERITSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PERSHING.json b/inst/extdata/OSD/P/PERSHING.json index 252e53548d..db080a9e26 100644 --- a/inst/extdata/OSD/P/PERSHING.json +++ b/inst/extdata/OSD/P/PERSHING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PESMORE.json b/inst/extdata/OSD/P/PESMORE.json index eb357ed2d8..3d316addf0 100644 --- a/inst/extdata/OSD/P/PESMORE.json +++ b/inst/extdata/OSD/P/PESMORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PETROF.json b/inst/extdata/OSD/P/PETROF.json index ed285cbc7a..b09716b697 100644 --- a/inst/extdata/OSD/P/PETROF.json +++ b/inst/extdata/OSD/P/PETROF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PETROLIA.json b/inst/extdata/OSD/P/PETROLIA.json index 33ede8eeb7..9e50cbcfc7 100644 --- a/inst/extdata/OSD/P/PETROLIA.json +++ b/inst/extdata/OSD/P/PETROLIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PETZEL.json b/inst/extdata/OSD/P/PETZEL.json index c768f8be66..316fabe848 100644 --- a/inst/extdata/OSD/P/PETZEL.json +++ b/inst/extdata/OSD/P/PETZEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PHAGE.json b/inst/extdata/OSD/P/PHAGE.json index fa90166ccb..5ebc42ba12 100644 --- a/inst/extdata/OSD/P/PHAGE.json +++ b/inst/extdata/OSD/P/PHAGE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well or somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PHARO.json b/inst/extdata/OSD/P/PHARO.json index ad25589337..ef47f06560 100644 --- a/inst/extdata/OSD/P/PHARO.json +++ b/inst/extdata/OSD/P/PHARO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/P/PHILDER.json b/inst/extdata/OSD/P/PHILDER.json index 34560b71fd..63040c3ac1 100644 --- a/inst/extdata/OSD/P/PHILDER.json +++ b/inst/extdata/OSD/P/PHILDER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PHOEBE.json b/inst/extdata/OSD/P/PHOEBE.json index b6f21e00b7..4bbcd5a394 100644 --- a/inst/extdata/OSD/P/PHOEBE.json +++ b/inst/extdata/OSD/P/PHOEBE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PICAYUNE.json b/inst/extdata/OSD/P/PICAYUNE.json index 7692cc6cbc..784c0d3773 100644 --- a/inst/extdata/OSD/P/PICAYUNE.json +++ b/inst/extdata/OSD/P/PICAYUNE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PIEDRABLANCA.json b/inst/extdata/OSD/P/PIEDRABLANCA.json index 01751aeb1c..a739c54507 100644 --- a/inst/extdata/OSD/P/PIEDRABLANCA.json +++ b/inst/extdata/OSD/P/PIEDRABLANCA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/P/PILCHUCK.json b/inst/extdata/OSD/P/PILCHUCK.json index 0a7b23bb9d..a8324a71c8 100644 --- a/inst/extdata/OSD/P/PILCHUCK.json +++ b/inst/extdata/OSD/P/PILCHUCK.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "excessively" + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/P/PILEDRIVER.json b/inst/extdata/OSD/P/PILEDRIVER.json index 4037088d43..4c4d173136 100644 --- a/inst/extdata/OSD/P/PILEDRIVER.json +++ b/inst/extdata/OSD/P/PILEDRIVER.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "" + "drainage_overview": "somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PILLARS.json b/inst/extdata/OSD/P/PILLARS.json index 9ae99314d2..9c74772019 100644 --- a/inst/extdata/OSD/P/PILLARS.json +++ b/inst/extdata/OSD/P/PILLARS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PILOTPEAK.json b/inst/extdata/OSD/P/PILOTPEAK.json index 0438632308..9e81d6586d 100644 --- a/inst/extdata/OSD/P/PILOTPEAK.json +++ b/inst/extdata/OSD/P/PILOTPEAK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PINAL.json b/inst/extdata/OSD/P/PINAL.json index df0dec8fa5..10390e06d0 100644 --- a/inst/extdata/OSD/P/PINAL.json +++ b/inst/extdata/OSD/P/PINAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PINCKNEY.json b/inst/extdata/OSD/P/PINCKNEY.json index d8da1e8594..b3e4616f42 100644 --- a/inst/extdata/OSD/P/PINCKNEY.json +++ b/inst/extdata/OSD/P/PINCKNEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PINCONNING.json b/inst/extdata/OSD/P/PINCONNING.json index 021e3c0439..526cd4d6c0 100644 --- a/inst/extdata/OSD/P/PINCONNING.json +++ b/inst/extdata/OSD/P/PINCONNING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PINEGAP.json b/inst/extdata/OSD/P/PINEGAP.json index 5d3f16e6d5..ff3cb89113 100644 --- a/inst/extdata/OSD/P/PINEGAP.json +++ b/inst/extdata/OSD/P/PINEGAP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PINEGUEST.json b/inst/extdata/OSD/P/PINEGUEST.json index 73d90ebe1e..0e41ad072d 100644 --- a/inst/extdata/OSD/P/PINEGUEST.json +++ b/inst/extdata/OSD/P/PINEGUEST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PINERIDGE.json b/inst/extdata/OSD/P/PINERIDGE.json index f7def0e9ce..508f8ffebf 100644 --- a/inst/extdata/OSD/P/PINERIDGE.json +++ b/inst/extdata/OSD/P/PINERIDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/PINNACLE.json b/inst/extdata/OSD/P/PINNACLE.json index 6e90b2b959..389d802253 100644 --- a/inst/extdata/OSD/P/PINNACLE.json +++ b/inst/extdata/OSD/P/PINNACLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PINNACLES.json b/inst/extdata/OSD/P/PINNACLES.json index 8150ae77ca..61068d6932 100644 --- a/inst/extdata/OSD/P/PINNACLES.json +++ b/inst/extdata/OSD/P/PINNACLES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PINUSCREEK.json b/inst/extdata/OSD/P/PINUSCREEK.json index a356313d66..0dce2d2f97 100644 --- a/inst/extdata/OSD/P/PINUSCREEK.json +++ b/inst/extdata/OSD/P/PINUSCREEK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PIOPOLIS.json b/inst/extdata/OSD/P/PIOPOLIS.json index 063b628c21..84f0b79597 100644 --- a/inst/extdata/OSD/P/PIOPOLIS.json +++ b/inst/extdata/OSD/P/PIOPOLIS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PISHAGQUA.json b/inst/extdata/OSD/P/PISHAGQUA.json index 8b69b87a77..47c3552b3b 100644 --- a/inst/extdata/OSD/P/PISHAGQUA.json +++ b/inst/extdata/OSD/P/PISHAGQUA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/P/PIUTESPRING.json b/inst/extdata/OSD/P/PIUTESPRING.json index 4e75a3920d..b275a332f7 100644 --- a/inst/extdata/OSD/P/PIUTESPRING.json +++ b/inst/extdata/OSD/P/PIUTESPRING.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PLACENTIA.json b/inst/extdata/OSD/P/PLACENTIA.json index 0eb19d2cc8..fbf1a3713b 100644 --- a/inst/extdata/OSD/P/PLACENTIA.json +++ b/inst/extdata/OSD/P/PLACENTIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PLATDON.json b/inst/extdata/OSD/P/PLATDON.json index 08dc005e21..9f73127901 100644 --- a/inst/extdata/OSD/P/PLATDON.json +++ b/inst/extdata/OSD/P/PLATDON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PLEASANT.json b/inst/extdata/OSD/P/PLEASANT.json index e48b04d964..e99e2a2321 100644 --- a/inst/extdata/OSD/P/PLEASANT.json +++ b/inst/extdata/OSD/P/PLEASANT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PLEASANTON.json b/inst/extdata/OSD/P/PLEASANTON.json index 8a21adb998..b73fbd6198 100644 --- a/inst/extdata/OSD/P/PLEASANTON.json +++ b/inst/extdata/OSD/P/PLEASANTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PLEASANT_GROVE.json b/inst/extdata/OSD/P/PLEASANT_GROVE.json index 1c00f3a7cb..716bf8e693 100644 --- a/inst/extdata/OSD/P/PLEASANT_GROVE.json +++ b/inst/extdata/OSD/P/PLEASANT_GROVE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PLUMASANO.json b/inst/extdata/OSD/P/PLUMASANO.json index 163e662893..be0e3624e9 100644 --- a/inst/extdata/OSD/P/PLUMASANO.json +++ b/inst/extdata/OSD/P/PLUMASANO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PLUMMER.json b/inst/extdata/OSD/P/PLUMMER.json index 5b5d5a9849..bbe202c884 100644 --- a/inst/extdata/OSD/P/PLUMMER.json +++ b/inst/extdata/OSD/P/PLUMMER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/POARCH.json b/inst/extdata/OSD/P/POARCH.json index 1dcf8df162..04f003245c 100644 --- a/inst/extdata/OSD/P/POARCH.json +++ b/inst/extdata/OSD/P/POARCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PODEN.json b/inst/extdata/OSD/P/PODEN.json index d09104fb3d..ca4154d67d 100644 --- a/inst/extdata/OSD/P/PODEN.json +++ b/inst/extdata/OSD/P/PODEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/POGUEPOINT.json b/inst/extdata/OSD/P/POGUEPOINT.json index f476bddbfe..3a39af2d10 100644 --- a/inst/extdata/OSD/P/POGUEPOINT.json +++ b/inst/extdata/OSD/P/POGUEPOINT.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/POHOCCO.json b/inst/extdata/OSD/P/POHOCCO.json index 7368b83fd5..63211e8cef 100644 --- a/inst/extdata/OSD/P/POHOCCO.json +++ b/inst/extdata/OSD/P/POHOCCO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/POISONCREEK.json b/inst/extdata/OSD/P/POISONCREEK.json index 3f17a06e62..abfaf86e44 100644 --- a/inst/extdata/OSD/P/POISONCREEK.json +++ b/inst/extdata/OSD/P/POISONCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/POLATIS.json b/inst/extdata/OSD/P/POLATIS.json index 2fc8722be8..9bc0b67317 100644 --- a/inst/extdata/OSD/P/POLATIS.json +++ b/inst/extdata/OSD/P/POLATIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/POLOVINA.json b/inst/extdata/OSD/P/POLOVINA.json index 749db84024..925d8cd6fb 100644 --- a/inst/extdata/OSD/P/POLOVINA.json +++ b/inst/extdata/OSD/P/POLOVINA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/POMELLO.json b/inst/extdata/OSD/P/POMELLO.json index 8928568186..e6012ab75f 100644 --- a/inst/extdata/OSD/P/POMELLO.json +++ b/inst/extdata/OSD/P/POMELLO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/POMONA.json b/inst/extdata/OSD/P/POMONA.json index dbe035bf8f..a06b7d4e92 100644 --- a/inst/extdata/OSD/P/POMONA.json +++ b/inst/extdata/OSD/P/POMONA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/POMPANO.json b/inst/extdata/OSD/P/POMPANO.json index 8158f2f99d..6252a525fc 100644 --- a/inst/extdata/OSD/P/POMPANO.json +++ b/inst/extdata/OSD/P/POMPANO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly to poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/POMPTON.json b/inst/extdata/OSD/P/POMPTON.json index 778dd46b9e..4bc5ce3af3 100644 --- a/inst/extdata/OSD/P/POMPTON.json +++ b/inst/extdata/OSD/P/POMPTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/POND.json b/inst/extdata/OSD/P/POND.json index 2ee50f6dd9..9c72d92baf 100644 --- a/inst/extdata/OSD/P/POND.json +++ b/inst/extdata/OSD/P/POND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/POORMA.json b/inst/extdata/OSD/P/POORMA.json index 2a841d0687..c6afeae619 100644 --- a/inst/extdata/OSD/P/POORMA.json +++ b/inst/extdata/OSD/P/POORMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/POOSE.json b/inst/extdata/OSD/P/POOSE.json index 16d9056c51..ac2e5b878e 100644 --- a/inst/extdata/OSD/P/POOSE.json +++ b/inst/extdata/OSD/P/POOSE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PORCH.json b/inst/extdata/OSD/P/PORCH.json index 1cfd93dbb6..f0dde2e260 100644 --- a/inst/extdata/OSD/P/PORCH.json +++ b/inst/extdata/OSD/P/PORCH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PORTAGE.json b/inst/extdata/OSD/P/PORTAGE.json index ba80bf3b76..2311894d27 100644 --- a/inst/extdata/OSD/P/PORTAGE.json +++ b/inst/extdata/OSD/P/PORTAGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PORTDICK.json b/inst/extdata/OSD/P/PORTDICK.json index 4c1be9a18e..a2f65f86c2 100644 --- a/inst/extdata/OSD/P/PORTDICK.json +++ b/inst/extdata/OSD/P/PORTDICK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PORTNEUF.json b/inst/extdata/OSD/P/PORTNEUF.json index 802876fb14..bfbbf3abdd 100644 --- a/inst/extdata/OSD/P/PORTNEUF.json +++ b/inst/extdata/OSD/P/PORTNEUF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PORTOLA.json b/inst/extdata/OSD/P/PORTOLA.json index 021facfa72..594b60bfc1 100644 --- a/inst/extdata/OSD/P/PORTOLA.json +++ b/inst/extdata/OSD/P/PORTOLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/POTTSBURG.json b/inst/extdata/OSD/P/POTTSBURG.json index e04cf927ad..81c9cac95a 100644 --- a/inst/extdata/OSD/P/POTTSBURG.json +++ b/inst/extdata/OSD/P/POTTSBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/POUDRE.json b/inst/extdata/OSD/P/POUDRE.json index 8ca6d26417..d798fca4c5 100644 --- a/inst/extdata/OSD/P/POUDRE.json +++ b/inst/extdata/OSD/P/POUDRE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "poorly or somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/POWDERRIVER.json b/inst/extdata/OSD/P/POWDERRIVER.json index 8b7e895887..dda3bcf715 100644 --- a/inst/extdata/OSD/P/POWDERRIVER.json +++ b/inst/extdata/OSD/P/POWDERRIVER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PRADE.json b/inst/extdata/OSD/P/PRADE.json index 02f5cc791d..451890c155 100644 --- a/inst/extdata/OSD/P/PRADE.json +++ b/inst/extdata/OSD/P/PRADE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PRAG.json b/inst/extdata/OSD/P/PRAG.json index 2506c98fb2..baac865374 100644 --- a/inst/extdata/OSD/P/PRAG.json +++ b/inst/extdata/OSD/P/PRAG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PRAIRIE.json b/inst/extdata/OSD/P/PRAIRIE.json index c4ca39d8bf..383d2a2a1f 100644 --- a/inst/extdata/OSD/P/PRAIRIE.json +++ b/inst/extdata/OSD/P/PRAIRIE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PREAKNESS.json b/inst/extdata/OSD/P/PREAKNESS.json index e74ec20f48..10290b1937 100644 --- a/inst/extdata/OSD/P/PREAKNESS.json +++ b/inst/extdata/OSD/P/PREAKNESS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PREATORSON.json b/inst/extdata/OSD/P/PREATORSON.json index d12e9d98d0..7dc41fb6db 100644 --- a/inst/extdata/OSD/P/PREATORSON.json +++ b/inst/extdata/OSD/P/PREATORSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PREBISH.json b/inst/extdata/OSD/P/PREBISH.json index 170be5b491..f91caa7789 100644 --- a/inst/extdata/OSD/P/PREBISH.json +++ b/inst/extdata/OSD/P/PREBISH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PRESTON.json b/inst/extdata/OSD/P/PRESTON.json index c44ce0c689..c2e5edbc39 100644 --- a/inst/extdata/OSD/P/PRESTON.json +++ b/inst/extdata/OSD/P/PRESTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively or somewhat excessively", - "drainage_overview": "excessively and somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/P/PRIESTGRADE.json b/inst/extdata/OSD/P/PRIESTGRADE.json index dadfaabeec..ccde4505e9 100644 --- a/inst/extdata/OSD/P/PRIESTGRADE.json +++ b/inst/extdata/OSD/P/PRIESTGRADE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PRIESTLAKE.json b/inst/extdata/OSD/P/PRIESTLAKE.json index 9c90a6a8b3..a4f3f5148c 100644 --- a/inst/extdata/OSD/P/PRIESTLAKE.json +++ b/inst/extdata/OSD/P/PRIESTLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PRITCHETT.json b/inst/extdata/OSD/P/PRITCHETT.json index 2d051d54d3..51ebbf2fbc 100644 --- a/inst/extdata/OSD/P/PRITCHETT.json +++ b/inst/extdata/OSD/P/PRITCHETT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PROMO.json b/inst/extdata/OSD/P/PROMO.json index da275e7082..a25d2044af 100644 --- a/inst/extdata/OSD/P/PROMO.json +++ b/inst/extdata/OSD/P/PROMO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/P/PUAPUA.json b/inst/extdata/OSD/P/PUAPUA.json index 623fb67f59..182de34f00 100644 --- a/inst/extdata/OSD/P/PUAPUA.json +++ b/inst/extdata/OSD/P/PUAPUA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/P/PUCKUM.json b/inst/extdata/OSD/P/PUCKUM.json index 6f9146ea0e..8177663b5d 100644 --- a/inst/extdata/OSD/P/PUCKUM.json +++ b/inst/extdata/OSD/P/PUCKUM.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "" + "drainage_overview": "very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PUDDLE.json b/inst/extdata/OSD/P/PUDDLE.json index a7d526f064..e21bbbee42 100644 --- a/inst/extdata/OSD/P/PUDDLE.json +++ b/inst/extdata/OSD/P/PUDDLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PUERCO.json b/inst/extdata/OSD/P/PUERCO.json index c639307d10..b5a7da81ef 100644 --- a/inst/extdata/OSD/P/PUERCO.json +++ b/inst/extdata/OSD/P/PUERCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PULLBACK.json b/inst/extdata/OSD/P/PULLBACK.json index 907f2d10b7..eeacfd0930 100644 --- a/inst/extdata/OSD/P/PULLBACK.json +++ b/inst/extdata/OSD/P/PULLBACK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PULLOUT.json b/inst/extdata/OSD/P/PULLOUT.json index d5ffa4a91c..1d7f42c28e 100644 --- a/inst/extdata/OSD/P/PULLOUT.json +++ b/inst/extdata/OSD/P/PULLOUT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/P/PULS.json b/inst/extdata/OSD/P/PULS.json index 76b20f6cf8..82517fff2e 100644 --- a/inst/extdata/OSD/P/PULS.json +++ b/inst/extdata/OSD/P/PULS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PULSIPHER.json b/inst/extdata/OSD/P/PULSIPHER.json index 9885e77346..4963da77a3 100644 --- a/inst/extdata/OSD/P/PULSIPHER.json +++ b/inst/extdata/OSD/P/PULSIPHER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PURCHASE.json b/inst/extdata/OSD/P/PURCHASE.json index 0690eaddc8..036dac21f8 100644 --- a/inst/extdata/OSD/P/PURCHASE.json +++ b/inst/extdata/OSD/P/PURCHASE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "moderately well to well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/P/PURCHES.json b/inst/extdata/OSD/P/PURCHES.json index 5535eaeb50..3517f5c976 100644 --- a/inst/extdata/OSD/P/PURCHES.json +++ b/inst/extdata/OSD/P/PURCHES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/P/PURDY.json b/inst/extdata/OSD/P/PURDY.json index 2687bc8e0c..55da691e6f 100644 --- a/inst/extdata/OSD/P/PURDY.json +++ b/inst/extdata/OSD/P/PURDY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/P/PURVES.json b/inst/extdata/OSD/P/PURVES.json index 52b8b9b73a..610059ac8f 100644 --- a/inst/extdata/OSD/P/PURVES.json +++ b/inst/extdata/OSD/P/PURVES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/P/PUSTOI.json b/inst/extdata/OSD/P/PUSTOI.json index b4a72f3cc0..398e0a3a71 100644 --- a/inst/extdata/OSD/P/PUSTOI.json +++ b/inst/extdata/OSD/P/PUSTOI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/P/PYLE.json b/inst/extdata/OSD/P/PYLE.json index 19d29663f0..8f0047c4cb 100644 --- a/inst/extdata/OSD/P/PYLE.json +++ b/inst/extdata/OSD/P/PYLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/Q/QUAM.json b/inst/extdata/OSD/Q/QUAM.json index 1313806345..274a8d53ad 100644 --- a/inst/extdata/OSD/Q/QUAM.json +++ b/inst/extdata/OSD/Q/QUAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/Q/QUEALMAN.json b/inst/extdata/OSD/Q/QUEALMAN.json index 3975f65d0f..49d1cff9ab 100644 --- a/inst/extdata/OSD/Q/QUEALMAN.json +++ b/inst/extdata/OSD/Q/QUEALMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "somewhat poorly to moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/Q/QUEENY.json b/inst/extdata/OSD/Q/QUEENY.json index a7b2324110..b1a56dfe98 100644 --- a/inst/extdata/OSD/Q/QUEENY.json +++ b/inst/extdata/OSD/Q/QUEENY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Q/QUIBURI.json b/inst/extdata/OSD/Q/QUIBURI.json index 10b667f18f..c2e7fb297b 100644 --- a/inst/extdata/OSD/Q/QUIBURI.json +++ b/inst/extdata/OSD/Q/QUIBURI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/Q/QUIETUS.json b/inst/extdata/OSD/Q/QUIETUS.json index e7c0ab7ea1..992078ccca 100644 --- a/inst/extdata/OSD/Q/QUIETUS.json +++ b/inst/extdata/OSD/Q/QUIETUS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Q/QUIMA.json b/inst/extdata/OSD/Q/QUIMA.json index 2727863692..ed938130f3 100644 --- a/inst/extdata/OSD/Q/QUIMA.json +++ b/inst/extdata/OSD/Q/QUIMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Q/QUIVER.json b/inst/extdata/OSD/Q/QUIVER.json index 0a0e8d6719..942c8e06b6 100644 --- a/inst/extdata/OSD/Q/QUIVER.json +++ b/inst/extdata/OSD/Q/QUIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/Q/QUTAL.json b/inst/extdata/OSD/Q/QUTAL.json index 5b96173de3..92fd73dbf0 100644 --- a/inst/extdata/OSD/Q/QUTAL.json +++ b/inst/extdata/OSD/Q/QUTAL.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat poorly", - "drainage_overview": "" + "drainage_overview": "somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/R/RACE.json b/inst/extdata/OSD/R/RACE.json index a3c5fce2a3..71840761cc 100644 --- a/inst/extdata/OSD/R/RACE.json +++ b/inst/extdata/OSD/R/RACE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/RACKET.json b/inst/extdata/OSD/R/RACKET.json index c9cae7058d..b62a5428f5 100644 --- a/inst/extdata/OSD/R/RACKET.json +++ b/inst/extdata/OSD/R/RACKET.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/RADIOVILLE.json b/inst/extdata/OSD/R/RADIOVILLE.json index 4847768fe6..e505454a69 100644 --- a/inst/extdata/OSD/R/RADIOVILLE.json +++ b/inst/extdata/OSD/R/RADIOVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RAGGEDROCK.json b/inst/extdata/OSD/R/RAGGEDROCK.json index f1785edd07..9224662f2b 100644 --- a/inst/extdata/OSD/R/RAGGEDROCK.json +++ b/inst/extdata/OSD/R/RAGGEDROCK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/RAGO.json b/inst/extdata/OSD/R/RAGO.json index 9564d6ca22..b86bfb3a03 100644 --- a/inst/extdata/OSD/R/RAGO.json +++ b/inst/extdata/OSD/R/RAGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/RAINEY.json b/inst/extdata/OSD/R/RAINEY.json index efd4c120e3..31ebb36d94 100644 --- a/inst/extdata/OSD/R/RAINEY.json +++ b/inst/extdata/OSD/R/RAINEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RAMELLI.json b/inst/extdata/OSD/R/RAMELLI.json index 097d14ab25..61c75b7f69 100644 --- a/inst/extdata/OSD/R/RAMELLI.json +++ b/inst/extdata/OSD/R/RAMELLI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RAMONA.json b/inst/extdata/OSD/R/RAMONA.json index 8e866ecec2..7789da9f9d 100644 --- a/inst/extdata/OSD/R/RAMONA.json +++ b/inst/extdata/OSD/R/RAMONA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RAMSHORN.json b/inst/extdata/OSD/R/RAMSHORN.json index 246271d03a..f4bc21e2dd 100644 --- a/inst/extdata/OSD/R/RAMSHORN.json +++ b/inst/extdata/OSD/R/RAMSHORN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RANES.json b/inst/extdata/OSD/R/RANES.json index f89fdf71a0..8df010b8b7 100644 --- a/inst/extdata/OSD/R/RANES.json +++ b/inst/extdata/OSD/R/RANES.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/RANGER.json b/inst/extdata/OSD/R/RANGER.json index 839eebfea8..555f3f4bff 100644 --- a/inst/extdata/OSD/R/RANGER.json +++ b/inst/extdata/OSD/R/RANGER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RAPID.json b/inst/extdata/OSD/R/RAPID.json index 3393245a59..2edc888a34 100644 --- a/inst/extdata/OSD/R/RAPID.json +++ b/inst/extdata/OSD/R/RAPID.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RAPIDCREEK.json b/inst/extdata/OSD/R/RAPIDCREEK.json index 9cf1292efe..54231b67a6 100644 --- a/inst/extdata/OSD/R/RAPIDCREEK.json +++ b/inst/extdata/OSD/R/RAPIDCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RARITAN.json b/inst/extdata/OSD/R/RARITAN.json index b3218a64ab..f54fc71d2a 100644 --- a/inst/extdata/OSD/R/RARITAN.json +++ b/inst/extdata/OSD/R/RARITAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/R/RAZITO.json b/inst/extdata/OSD/R/RAZITO.json index 7a0e789f06..53f968c91d 100644 --- a/inst/extdata/OSD/R/RAZITO.json +++ b/inst/extdata/OSD/R/RAZITO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/R/READING.json b/inst/extdata/OSD/R/READING.json index fc29bc68ef..da83d6fe4f 100644 --- a/inst/extdata/OSD/R/READING.json +++ b/inst/extdata/OSD/R/READING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REAKOR.json b/inst/extdata/OSD/R/REAKOR.json index 8a2179ccea..7022c61c93 100644 --- a/inst/extdata/OSD/R/REAKOR.json +++ b/inst/extdata/OSD/R/REAKOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/REAVILLE.json b/inst/extdata/OSD/R/REAVILLE.json index db34c7fe31..748c086dc3 100644 --- a/inst/extdata/OSD/R/REAVILLE.json +++ b/inst/extdata/OSD/R/REAVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/R/REBA.json b/inst/extdata/OSD/R/REBA.json index 480c170bce..173ce0afd4 100644 --- a/inst/extdata/OSD/R/REBA.json +++ b/inst/extdata/OSD/R/REBA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/REDDING.json b/inst/extdata/OSD/R/REDDING.json index 8af92e1899..3e166708f5 100644 --- a/inst/extdata/OSD/R/REDDING.json +++ b/inst/extdata/OSD/R/REDDING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REDFIELD.json b/inst/extdata/OSD/R/REDFIELD.json index 4c0838f674..b48cd6f735 100644 --- a/inst/extdata/OSD/R/REDFIELD.json +++ b/inst/extdata/OSD/R/REDFIELD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REDFISH.json b/inst/extdata/OSD/R/REDFISH.json index 1f70b1d9fb..b2099fb922 100644 --- a/inst/extdata/OSD/R/REDFISH.json +++ b/inst/extdata/OSD/R/REDFISH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/REDMANSON.json b/inst/extdata/OSD/R/REDMANSON.json index cf00811ce7..845e918cd2 100644 --- a/inst/extdata/OSD/R/REDMANSON.json +++ b/inst/extdata/OSD/R/REDMANSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/REDNUN.json b/inst/extdata/OSD/R/REDNUN.json index db01254791..bdd7a02066 100644 --- a/inst/extdata/OSD/R/REDNUN.json +++ b/inst/extdata/OSD/R/REDNUN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REDTOM.json b/inst/extdata/OSD/R/REDTOM.json index c089305df8..21fb69cfca 100644 --- a/inst/extdata/OSD/R/REDTOM.json +++ b/inst/extdata/OSD/R/REDTOM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/REDTOP.json b/inst/extdata/OSD/R/REDTOP.json index 69ac8865c4..24793be0a1 100644 --- a/inst/extdata/OSD/R/REDTOP.json +++ b/inst/extdata/OSD/R/REDTOP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/REDVIEW.json b/inst/extdata/OSD/R/REDVIEW.json index 6ec996274c..e2e0257a62 100644 --- a/inst/extdata/OSD/R/REDVIEW.json +++ b/inst/extdata/OSD/R/REDVIEW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/RED_HILL.json b/inst/extdata/OSD/R/RED_HILL.json index 717dc8591c..a0ff523fad 100644 --- a/inst/extdata/OSD/R/RED_HILL.json +++ b/inst/extdata/OSD/R/RED_HILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/REGAN.json b/inst/extdata/OSD/R/REGAN.json index 36b1efe7a2..82e70e5f6b 100644 --- a/inst/extdata/OSD/R/REGAN.json +++ b/inst/extdata/OSD/R/REGAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/REGGEAR.json b/inst/extdata/OSD/R/REGGEAR.json index 05f46d181b..312dac3fed 100644 --- a/inst/extdata/OSD/R/REGGEAR.json +++ b/inst/extdata/OSD/R/REGGEAR.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REKOP.json b/inst/extdata/OSD/R/REKOP.json index 9691a3c085..f66efb6f1f 100644 --- a/inst/extdata/OSD/R/REKOP.json +++ b/inst/extdata/OSD/R/REKOP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RELAN.json b/inst/extdata/OSD/R/RELAN.json index b4c9a0f7f6..aa06286da6 100644 --- a/inst/extdata/OSD/R/RELAN.json +++ b/inst/extdata/OSD/R/RELAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RELIZ.json b/inst/extdata/OSD/R/RELIZ.json index f2cb9488b2..c766469da5 100644 --- a/inst/extdata/OSD/R/RELIZ.json +++ b/inst/extdata/OSD/R/RELIZ.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/R/REMEDIOS.json b/inst/extdata/OSD/R/REMEDIOS.json index 08f7ef8613..d4f55032ca 100644 --- a/inst/extdata/OSD/R/REMEDIOS.json +++ b/inst/extdata/OSD/R/REMEDIOS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/REMMIT.json b/inst/extdata/OSD/R/REMMIT.json index 71f435c53b..9649261565 100644 --- a/inst/extdata/OSD/R/REMMIT.json +++ b/inst/extdata/OSD/R/REMMIT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RENBAC.json b/inst/extdata/OSD/R/RENBAC.json index 88407c7840..4bcbb3756b 100644 --- a/inst/extdata/OSD/R/RENBAC.json +++ b/inst/extdata/OSD/R/RENBAC.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RENCALSON.json b/inst/extdata/OSD/R/RENCALSON.json index 1487d98ed8..a318d6c3b0 100644 --- a/inst/extdata/OSD/R/RENCALSON.json +++ b/inst/extdata/OSD/R/RENCALSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RENSSELAER.json b/inst/extdata/OSD/R/RENSSELAER.json index 788314c78a..3d34785ee5 100644 --- a/inst/extdata/OSD/R/RENSSELAER.json +++ b/inst/extdata/OSD/R/RENSSELAER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/REPPART.json b/inst/extdata/OSD/R/REPPART.json index b58da53ab5..bc155acc58 100644 --- a/inst/extdata/OSD/R/REPPART.json +++ b/inst/extdata/OSD/R/REPPART.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RESCUE.json b/inst/extdata/OSD/R/RESCUE.json index be5d989e29..56127336b5 100644 --- a/inst/extdata/OSD/R/RESCUE.json +++ b/inst/extdata/OSD/R/RESCUE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RETRIEVER.json b/inst/extdata/OSD/R/RETRIEVER.json index 96c0041bb5..3e6e74d82c 100644 --- a/inst/extdata/OSD/R/RETRIEVER.json +++ b/inst/extdata/OSD/R/RETRIEVER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/REXFORD.json b/inst/extdata/OSD/R/REXFORD.json index 0bab1fd38a..e6fd481d2c 100644 --- a/inst/extdata/OSD/R/REXFORD.json +++ b/inst/extdata/OSD/R/REXFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/R/REXVILLE.json b/inst/extdata/OSD/R/REXVILLE.json index 4f81f4edc7..716857d0a4 100644 --- a/inst/extdata/OSD/R/REXVILLE.json +++ b/inst/extdata/OSD/R/REXVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/R/RHOADES.json b/inst/extdata/OSD/R/RHOADES.json index 3106ec0bd7..4822b7bdfc 100644 --- a/inst/extdata/OSD/R/RHOADES.json +++ b/inst/extdata/OSD/R/RHOADES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/RHODESFOLLY.json b/inst/extdata/OSD/R/RHODESFOLLY.json index ee85d77196..9a1e05cb28 100644 --- a/inst/extdata/OSD/R/RHODESFOLLY.json +++ b/inst/extdata/OSD/R/RHODESFOLLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/R/RHODE_RIVER.json b/inst/extdata/OSD/R/RHODE_RIVER.json index 4387f53581..f1f65861ae 100644 --- a/inst/extdata/OSD/R/RHODE_RIVER.json +++ b/inst/extdata/OSD/R/RHODE_RIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/R/RICH.json b/inst/extdata/OSD/R/RICH.json index 4ed02a4527..2312fe8276 100644 --- a/inst/extdata/OSD/R/RICH.json +++ b/inst/extdata/OSD/R/RICH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/R/RICHFORD.json b/inst/extdata/OSD/R/RICHFORD.json index 6f4567f869..a4c38a2c72 100644 --- a/inst/extdata/OSD/R/RICHFORD.json +++ b/inst/extdata/OSD/R/RICHFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RICKER.json b/inst/extdata/OSD/R/RICKER.json index a0ebf45156..b35da29cbc 100644 --- a/inst/extdata/OSD/R/RICKER.json +++ b/inst/extdata/OSD/R/RICKER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RIDGEBURY.json b/inst/extdata/OSD/R/RIDGEBURY.json index f4adbbd938..efe82d6d0d 100644 --- a/inst/extdata/OSD/R/RIDGEBURY.json +++ b/inst/extdata/OSD/R/RIDGEBURY.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/R/RIDIT.json b/inst/extdata/OSD/R/RIDIT.json index 0da48613b5..91a349e92a 100644 --- a/inst/extdata/OSD/R/RIDIT.json +++ b/inst/extdata/OSD/R/RIDIT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RIESEL.json b/inst/extdata/OSD/R/RIESEL.json index 749944f895..2e9978d8b4 100644 --- a/inst/extdata/OSD/R/RIESEL.json +++ b/inst/extdata/OSD/R/RIESEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RIGA.json b/inst/extdata/OSD/R/RIGA.json index 0c5fdf0fdf..a7ff9295da 100644 --- a/inst/extdata/OSD/R/RIGA.json +++ b/inst/extdata/OSD/R/RIGA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RIMFOREST.json b/inst/extdata/OSD/R/RIMFOREST.json index 579b1c1002..357a269f8c 100644 --- a/inst/extdata/OSD/R/RIMFOREST.json +++ b/inst/extdata/OSD/R/RIMFOREST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/RIN.json b/inst/extdata/OSD/R/RIN.json index c7aa99e1c9..ce07402d4e 100644 --- a/inst/extdata/OSD/R/RIN.json +++ b/inst/extdata/OSD/R/RIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RIPON.json b/inst/extdata/OSD/R/RIPON.json index d7aebcb329..e26dbbf1ad 100644 --- a/inst/extdata/OSD/R/RIPON.json +++ b/inst/extdata/OSD/R/RIPON.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/RIRIE.json b/inst/extdata/OSD/R/RIRIE.json index e5734b432a..27c2afb60a 100644 --- a/inst/extdata/OSD/R/RIRIE.json +++ b/inst/extdata/OSD/R/RIRIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RITO.json b/inst/extdata/OSD/R/RITO.json index e5996cdd26..75d4748bb8 100644 --- a/inst/extdata/OSD/R/RITO.json +++ b/inst/extdata/OSD/R/RITO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RIVIERA.json b/inst/extdata/OSD/R/RIVIERA.json index b119af7da2..90d8b6765b 100644 --- a/inst/extdata/OSD/R/RIVIERA.json +++ b/inst/extdata/OSD/R/RIVIERA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/R/RIZ.json b/inst/extdata/OSD/R/RIZ.json index 0e098b989e..b4a503faa0 100644 --- a/inst/extdata/OSD/R/RIZ.json +++ b/inst/extdata/OSD/R/RIZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RIZOZO.json b/inst/extdata/OSD/R/RIZOZO.json index f3a425b6c0..faa950edf6 100644 --- a/inst/extdata/OSD/R/RIZOZO.json +++ b/inst/extdata/OSD/R/RIZOZO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROBANA.json b/inst/extdata/OSD/R/ROBANA.json index b9191f5b17..5e4e2d4be2 100644 --- a/inst/extdata/OSD/R/ROBANA.json +++ b/inst/extdata/OSD/R/ROBANA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROBCO.json b/inst/extdata/OSD/R/ROBCO.json index bf5a278b93..d24b0eaf13 100644 --- a/inst/extdata/OSD/R/ROBCO.json +++ b/inst/extdata/OSD/R/ROBCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/R/ROCKAWAY.json b/inst/extdata/OSD/R/ROCKAWAY.json index cd17acf3c4..c557273f00 100644 --- a/inst/extdata/OSD/R/ROCKAWAY.json +++ b/inst/extdata/OSD/R/ROCKAWAY.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "well or moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROCKBOTTOM.json b/inst/extdata/OSD/R/ROCKBOTTOM.json index b1affc458f..5eecc31967 100644 --- a/inst/extdata/OSD/R/ROCKBOTTOM.json +++ b/inst/extdata/OSD/R/ROCKBOTTOM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROCKFORD.json b/inst/extdata/OSD/R/ROCKFORD.json index 6fa0504c57..331954afdb 100644 --- a/inst/extdata/OSD/R/ROCKFORD.json +++ b/inst/extdata/OSD/R/ROCKFORD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/ROCKLIN.json b/inst/extdata/OSD/R/ROCKLIN.json index c49ee2f143..e46fc44be9 100644 --- a/inst/extdata/OSD/R/ROCKLIN.json +++ b/inst/extdata/OSD/R/ROCKLIN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well or moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROCKUS.json b/inst/extdata/OSD/R/ROCKUS.json index cc31eb5f5c..af58f0f2fd 100644 --- a/inst/extdata/OSD/R/ROCKUS.json +++ b/inst/extdata/OSD/R/ROCKUS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROCKWELL.json b/inst/extdata/OSD/R/ROCKWELL.json index 419fc3c410..bc7e144920 100644 --- a/inst/extdata/OSD/R/ROCKWELL.json +++ b/inst/extdata/OSD/R/ROCKWELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROCKYBAR.json b/inst/extdata/OSD/R/ROCKYBAR.json index bcb04782ce..4a3e68f0b5 100644 --- a/inst/extdata/OSD/R/ROCKYBAR.json +++ b/inst/extdata/OSD/R/ROCKYBAR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/ROFORK.json b/inst/extdata/OSD/R/ROFORK.json index 3f1a1a7a68..e896d517bc 100644 --- a/inst/extdata/OSD/R/ROFORK.json +++ b/inst/extdata/OSD/R/ROFORK.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/ROLISS.json b/inst/extdata/OSD/R/ROLISS.json index bc05c8a38a..09d70146b2 100644 --- a/inst/extdata/OSD/R/ROLISS.json +++ b/inst/extdata/OSD/R/ROLISS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROLLAWAY.json b/inst/extdata/OSD/R/ROLLAWAY.json index 26d7238767..0fe00a3a31 100644 --- a/inst/extdata/OSD/R/ROLLAWAY.json +++ b/inst/extdata/OSD/R/ROLLAWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROME.json b/inst/extdata/OSD/R/ROME.json index a06a3a96f7..42404f9673 100644 --- a/inst/extdata/OSD/R/ROME.json +++ b/inst/extdata/OSD/R/ROME.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROMNELL.json b/inst/extdata/OSD/R/ROMNELL.json index 3155820340..e78196d306 100644 --- a/inst/extdata/OSD/R/ROMNELL.json +++ b/inst/extdata/OSD/R/ROMNELL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROND.json b/inst/extdata/OSD/R/ROND.json index db7e018fe1..fbafbb1c9c 100644 --- a/inst/extdata/OSD/R/ROND.json +++ b/inst/extdata/OSD/R/ROND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROOT.json b/inst/extdata/OSD/R/ROOT.json index 4b7b651b10..535fe4f711 100644 --- a/inst/extdata/OSD/R/ROOT.json +++ b/inst/extdata/OSD/R/ROOT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROOTEL.json b/inst/extdata/OSD/R/ROOTEL.json index 126e3d8443..c640b7437e 100644 --- a/inst/extdata/OSD/R/ROOTEL.json +++ b/inst/extdata/OSD/R/ROOTEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROSCOMMON.json b/inst/extdata/OSD/R/ROSCOMMON.json index 0a5849dec4..06f5783848 100644 --- a/inst/extdata/OSD/R/ROSCOMMON.json +++ b/inst/extdata/OSD/R/ROSCOMMON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROSEGLEN.json b/inst/extdata/OSD/R/ROSEGLEN.json index f418f3eff3..c3244ab4a9 100644 --- a/inst/extdata/OSD/R/ROSEGLEN.json +++ b/inst/extdata/OSD/R/ROSEGLEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROSEWOOD.json b/inst/extdata/OSD/R/ROSEWOOD.json index a2a8a9c646..d81b3fde10 100644 --- a/inst/extdata/OSD/R/ROSEWOOD.json +++ b/inst/extdata/OSD/R/ROSEWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROSMAN.json b/inst/extdata/OSD/R/ROSMAN.json index 7ec8095e62..2d980429e2 100644 --- a/inst/extdata/OSD/R/ROSMAN.json +++ b/inst/extdata/OSD/R/ROSMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROSSVILLE.json b/inst/extdata/OSD/R/ROSSVILLE.json index d52f54ba54..41390447c7 100644 --- a/inst/extdata/OSD/R/ROSSVILLE.json +++ b/inst/extdata/OSD/R/ROSSVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROTTULEE.json b/inst/extdata/OSD/R/ROTTULEE.json index 7be069cfdc..503826d328 100644 --- a/inst/extdata/OSD/R/ROTTULEE.json +++ b/inst/extdata/OSD/R/ROTTULEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/ROUGHCREEK.json b/inst/extdata/OSD/R/ROUGHCREEK.json index 873b46d65d..58ba8ceb82 100644 --- a/inst/extdata/OSD/R/ROUGHCREEK.json +++ b/inst/extdata/OSD/R/ROUGHCREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROUNDABOUT.json b/inst/extdata/OSD/R/ROUNDABOUT.json index 53f591c878..d79331f025 100644 --- a/inst/extdata/OSD/R/ROUNDABOUT.json +++ b/inst/extdata/OSD/R/ROUNDABOUT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROUNDMEADOW.json b/inst/extdata/OSD/R/ROUNDMEADOW.json index 60e45ff6ce..bd715f0cf4 100644 --- a/inst/extdata/OSD/R/ROUNDMEADOW.json +++ b/inst/extdata/OSD/R/ROUNDMEADOW.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/ROUNDTOP.json b/inst/extdata/OSD/R/ROUNDTOP.json index 434ec5e4e5..1ffe5d5d84 100644 --- a/inst/extdata/OSD/R/ROUNDTOP.json +++ b/inst/extdata/OSD/R/ROUNDTOP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/ROUNDVAL.json b/inst/extdata/OSD/R/ROUNDVAL.json index 5cd4197d4d..dfe6faad0b 100644 --- a/inst/extdata/OSD/R/ROUNDVAL.json +++ b/inst/extdata/OSD/R/ROUNDVAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROVAL.json b/inst/extdata/OSD/R/ROVAL.json index b4972b7c18..a52c890b74 100644 --- a/inst/extdata/OSD/R/ROVAL.json +++ b/inst/extdata/OSD/R/ROVAL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/R/ROWE.json b/inst/extdata/OSD/R/ROWE.json index 37fc90ad2c..28135e1b23 100644 --- a/inst/extdata/OSD/R/ROWE.json +++ b/inst/extdata/OSD/R/ROWE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROWLAND.json b/inst/extdata/OSD/R/ROWLAND.json index ca3a3d8488..2b4de5ee2e 100644 --- a/inst/extdata/OSD/R/ROWLAND.json +++ b/inst/extdata/OSD/R/ROWLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/R/ROXBURY.json b/inst/extdata/OSD/R/ROXBURY.json index 44bd322a0e..2847b2eea7 100644 --- a/inst/extdata/OSD/R/ROXBURY.json +++ b/inst/extdata/OSD/R/ROXBURY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/R/ROYOSA.json b/inst/extdata/OSD/R/ROYOSA.json index efc4a548e4..a71ebab039 100644 --- a/inst/extdata/OSD/R/ROYOSA.json +++ b/inst/extdata/OSD/R/ROYOSA.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "excessively or somewhat excessively" + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/R/RUBIO.json b/inst/extdata/OSD/R/RUBIO.json index a89dcccb82..c37c9516de 100644 --- a/inst/extdata/OSD/R/RUBIO.json +++ b/inst/extdata/OSD/R/RUBIO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RUBSON.json b/inst/extdata/OSD/R/RUBSON.json index d7e7ef9d71..96c9fa20ae 100644 --- a/inst/extdata/OSD/R/RUBSON.json +++ b/inst/extdata/OSD/R/RUBSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/R/RUDEEN.json b/inst/extdata/OSD/R/RUDEEN.json index 74420cbd47..28f41bbbd3 100644 --- a/inst/extdata/OSD/R/RUDEEN.json +++ b/inst/extdata/OSD/R/RUDEEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/R/RUMFORD.json b/inst/extdata/OSD/R/RUMFORD.json index b0f3479a1f..ef070265bf 100644 --- a/inst/extdata/OSD/R/RUMFORD.json +++ b/inst/extdata/OSD/R/RUMFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RUNEBERG.json b/inst/extdata/OSD/R/RUNEBERG.json index 7ac17ae79e..811991837b 100644 --- a/inst/extdata/OSD/R/RUNEBERG.json +++ b/inst/extdata/OSD/R/RUNEBERG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RUSE.json b/inst/extdata/OSD/R/RUSE.json index ac46ffba81..529828158d 100644 --- a/inst/extdata/OSD/R/RUSE.json +++ b/inst/extdata/OSD/R/RUSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RUSHVILLE.json b/inst/extdata/OSD/R/RUSHVILLE.json index fdf6038870..abedef53e0 100644 --- a/inst/extdata/OSD/R/RUSHVILLE.json +++ b/inst/extdata/OSD/R/RUSHVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/R/RUTAN.json b/inst/extdata/OSD/R/RUTAN.json index 620b6b2dc5..2740f74ce8 100644 --- a/inst/extdata/OSD/R/RUTAN.json +++ b/inst/extdata/OSD/R/RUTAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RYAN_PARK.json b/inst/extdata/OSD/R/RYAN_PARK.json index e71613559a..bb838927e4 100644 --- a/inst/extdata/OSD/R/RYAN_PARK.json +++ b/inst/extdata/OSD/R/RYAN_PARK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RYARK.json b/inst/extdata/OSD/R/RYARK.json index 6afb30ccac..8c311a83db 100644 --- a/inst/extdata/OSD/R/RYARK.json +++ b/inst/extdata/OSD/R/RYARK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well and somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/R/RYORP.json b/inst/extdata/OSD/R/RYORP.json index 39677b856f..543822fe89 100644 --- a/inst/extdata/OSD/R/RYORP.json +++ b/inst/extdata/OSD/R/RYORP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SACAHUISTA.json b/inst/extdata/OSD/S/SACAHUISTA.json index 0bea5b5ffb..eb435068a0 100644 --- a/inst/extdata/OSD/S/SACAHUISTA.json +++ b/inst/extdata/OSD/S/SACAHUISTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SAGANING.json b/inst/extdata/OSD/S/SAGANING.json index 7bc2975f8c..5c87f2a5df 100644 --- a/inst/extdata/OSD/S/SAGANING.json +++ b/inst/extdata/OSD/S/SAGANING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SAGUACHE.json b/inst/extdata/OSD/S/SAGUACHE.json index 3742578387..82b6b0322c 100644 --- a/inst/extdata/OSD/S/SAGUACHE.json +++ b/inst/extdata/OSD/S/SAGUACHE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SAHUARITA.json b/inst/extdata/OSD/S/SAHUARITA.json index 85e4866414..53bc64c3fc 100644 --- a/inst/extdata/OSD/S/SAHUARITA.json +++ b/inst/extdata/OSD/S/SAHUARITA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SALCO.json b/inst/extdata/OSD/S/SALCO.json index 54244b2bda..ade98a863e 100644 --- a/inst/extdata/OSD/S/SALCO.json +++ b/inst/extdata/OSD/S/SALCO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SALLYANN.json b/inst/extdata/OSD/S/SALLYANN.json index 2f7762cbf7..53ebdd826d 100644 --- a/inst/extdata/OSD/S/SALLYANN.json +++ b/inst/extdata/OSD/S/SALLYANN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SALMO.json b/inst/extdata/OSD/S/SALMO.json index 7b460b3267..745be61712 100644 --- a/inst/extdata/OSD/S/SALMO.json +++ b/inst/extdata/OSD/S/SALMO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/S/SALTAIR.json b/inst/extdata/OSD/S/SALTAIR.json index 31bb98c8fa..9b4a0abc6e 100644 --- a/inst/extdata/OSD/S/SALTAIR.json +++ b/inst/extdata/OSD/S/SALTAIR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SALT_LAKE.json b/inst/extdata/OSD/S/SALT_LAKE.json index 915e0fb571..3ef3be5779 100644 --- a/inst/extdata/OSD/S/SALT_LAKE.json +++ b/inst/extdata/OSD/S/SALT_LAKE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/S/SALVISA.json b/inst/extdata/OSD/S/SALVISA.json index 9ed65ca203..2535b58edd 100644 --- a/inst/extdata/OSD/S/SALVISA.json +++ b/inst/extdata/OSD/S/SALVISA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SANDFLY.json b/inst/extdata/OSD/S/SANDFLY.json index c38dd81529..1f09f203a2 100644 --- a/inst/extdata/OSD/S/SANDFLY.json +++ b/inst/extdata/OSD/S/SANDFLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SANDIA.json b/inst/extdata/OSD/S/SANDIA.json index 1d995d8522..a0841126c7 100644 --- a/inst/extdata/OSD/S/SANDIA.json +++ b/inst/extdata/OSD/S/SANDIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SAND_POINT.json b/inst/extdata/OSD/S/SAND_POINT.json index 3a8e93459b..85eb73ef62 100644 --- a/inst/extdata/OSD/S/SAND_POINT.json +++ b/inst/extdata/OSD/S/SAND_POINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SANMOSS.json b/inst/extdata/OSD/S/SANMOSS.json index a18ffbb3fd..d42183cc2a 100644 --- a/inst/extdata/OSD/S/SANMOSS.json +++ b/inst/extdata/OSD/S/SANMOSS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SANPETE.json b/inst/extdata/OSD/S/SANPETE.json index 6f155fb205..19b72d9f12 100644 --- a/inst/extdata/OSD/S/SANPETE.json +++ b/inst/extdata/OSD/S/SANPETE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SANPITCH.json b/inst/extdata/OSD/S/SANPITCH.json index f3c8cc9fb7..d0c2a5321d 100644 --- a/inst/extdata/OSD/S/SANPITCH.json +++ b/inst/extdata/OSD/S/SANPITCH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SANPOIL.json b/inst/extdata/OSD/S/SANPOIL.json index edc1f370c8..1288c598df 100644 --- a/inst/extdata/OSD/S/SANPOIL.json +++ b/inst/extdata/OSD/S/SANPOIL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SANTANONI.json b/inst/extdata/OSD/S/SANTANONI.json index ac91515e7e..dd45f46152 100644 --- a/inst/extdata/OSD/S/SANTANONI.json +++ b/inst/extdata/OSD/S/SANTANONI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/S/SANTA_LUCIA.json b/inst/extdata/OSD/S/SANTA_LUCIA.json index f174cc764a..bbda4e5227 100644 --- a/inst/extdata/OSD/S/SANTA_LUCIA.json +++ b/inst/extdata/OSD/S/SANTA_LUCIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SANTO_TOMAS.json b/inst/extdata/OSD/S/SANTO_TOMAS.json index feba7e9fa3..1c2deaaf6a 100644 --- a/inst/extdata/OSD/S/SANTO_TOMAS.json +++ b/inst/extdata/OSD/S/SANTO_TOMAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SAN_BENITO.json b/inst/extdata/OSD/S/SAN_BENITO.json index 4e1c5e1bde..49b9cecdaf 100644 --- a/inst/extdata/OSD/S/SAN_BENITO.json +++ b/inst/extdata/OSD/S/SAN_BENITO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SAN_ISABEL.json b/inst/extdata/OSD/S/SAN_ISABEL.json index 8ab769441a..a3b7a837dd 100644 --- a/inst/extdata/OSD/S/SAN_ISABEL.json +++ b/inst/extdata/OSD/S/SAN_ISABEL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SAN_JOAQUIN.json b/inst/extdata/OSD/S/SAN_JOAQUIN.json index f1cf3f0425..39ee5a534a 100644 --- a/inst/extdata/OSD/S/SAN_JOAQUIN.json +++ b/inst/extdata/OSD/S/SAN_JOAQUIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SAN_LUIS.json b/inst/extdata/OSD/S/SAN_LUIS.json index 258a674a5e..10488b38a1 100644 --- a/inst/extdata/OSD/S/SAN_LUIS.json +++ b/inst/extdata/OSD/S/SAN_LUIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/S/SAN_MIGUEL.json b/inst/extdata/OSD/S/SAN_MIGUEL.json index 487f20da07..19fd4a4387 100644 --- a/inst/extdata/OSD/S/SAN_MIGUEL.json +++ b/inst/extdata/OSD/S/SAN_MIGUEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SAN_TIMOTEO.json b/inst/extdata/OSD/S/SAN_TIMOTEO.json index 9dfff6e311..d849b48921 100644 --- a/inst/extdata/OSD/S/SAN_TIMOTEO.json +++ b/inst/extdata/OSD/S/SAN_TIMOTEO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SAPELO.json b/inst/extdata/OSD/S/SAPELO.json index 4217791c14..71f600c7bc 100644 --- a/inst/extdata/OSD/S/SAPELO.json +++ b/inst/extdata/OSD/S/SAPELO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/S/SARANAC.json b/inst/extdata/OSD/S/SARANAC.json index b66c9d8796..54d7a74767 100644 --- a/inst/extdata/OSD/S/SARANAC.json +++ b/inst/extdata/OSD/S/SARANAC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SARCOXIE.json b/inst/extdata/OSD/S/SARCOXIE.json index ae9181161c..6582075d7b 100644 --- a/inst/extdata/OSD/S/SARCOXIE.json +++ b/inst/extdata/OSD/S/SARCOXIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SATTLEY.json b/inst/extdata/OSD/S/SATTLEY.json index d4bf3e10fe..58c6595cef 100644 --- a/inst/extdata/OSD/S/SATTLEY.json +++ b/inst/extdata/OSD/S/SATTLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SAUK.json b/inst/extdata/OSD/S/SAUK.json index 6d35b2d473..f9a626fd9b 100644 --- a/inst/extdata/OSD/S/SAUK.json +++ b/inst/extdata/OSD/S/SAUK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SAULICH.json b/inst/extdata/OSD/S/SAULICH.json index 0b4d0b5ad2..ae9a8729c8 100644 --- a/inst/extdata/OSD/S/SAULICH.json +++ b/inst/extdata/OSD/S/SAULICH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SAVOIA.json b/inst/extdata/OSD/S/SAVOIA.json index 3ecd58a1d2..1c056d53cf 100644 --- a/inst/extdata/OSD/S/SAVOIA.json +++ b/inst/extdata/OSD/S/SAVOIA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SAWCREEK.json b/inst/extdata/OSD/S/SAWCREEK.json index 3dcfbe27ca..e57452596b 100644 --- a/inst/extdata/OSD/S/SAWCREEK.json +++ b/inst/extdata/OSD/S/SAWCREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SAWMILL.json b/inst/extdata/OSD/S/SAWMILL.json index 4fc1f10761..bfdd10238f 100644 --- a/inst/extdata/OSD/S/SAWMILL.json +++ b/inst/extdata/OSD/S/SAWMILL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SAYLES.json b/inst/extdata/OSD/S/SAYLES.json index 5fcd7ec318..0eb60623ab 100644 --- a/inst/extdata/OSD/S/SAYLES.json +++ b/inst/extdata/OSD/S/SAYLES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SCATTERSVILLE.json b/inst/extdata/OSD/S/SCATTERSVILLE.json index 1d30237f15..a7ce51a270 100644 --- a/inst/extdata/OSD/S/SCATTERSVILLE.json +++ b/inst/extdata/OSD/S/SCATTERSVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/S/SCHAMBER.json b/inst/extdata/OSD/S/SCHAMBER.json index 6849454def..a5f6b36b94 100644 --- a/inst/extdata/OSD/S/SCHAMBER.json +++ b/inst/extdata/OSD/S/SCHAMBER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SCHMUTZ.json b/inst/extdata/OSD/S/SCHMUTZ.json index d61b9b40f3..90041c7be6 100644 --- a/inst/extdata/OSD/S/SCHMUTZ.json +++ b/inst/extdata/OSD/S/SCHMUTZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SCHNEBLY.json b/inst/extdata/OSD/S/SCHNEBLY.json index 79441f6775..9f975b7edd 100644 --- a/inst/extdata/OSD/S/SCHNEBLY.json +++ b/inst/extdata/OSD/S/SCHNEBLY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SCHOONER.json b/inst/extdata/OSD/S/SCHOONER.json index 99353f372e..ae98fa7ca7 100644 --- a/inst/extdata/OSD/S/SCHOONER.json +++ b/inst/extdata/OSD/S/SCHOONER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to excessively", - "drainage_overview": "well to excessively" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SCHROCK.json b/inst/extdata/OSD/S/SCHROCK.json index 726ac93e44..b9b94edd8d 100644 --- a/inst/extdata/OSD/S/SCHROCK.json +++ b/inst/extdata/OSD/S/SCHROCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SCOTT.json b/inst/extdata/OSD/S/SCOTT.json index 5350caf32c..4faffdb0d6 100644 --- a/inst/extdata/OSD/S/SCOTT.json +++ b/inst/extdata/OSD/S/SCOTT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SCOTTY.json b/inst/extdata/OSD/S/SCOTTY.json index 8ccd3c467f..a03ff8ec0c 100644 --- a/inst/extdata/OSD/S/SCOTTY.json +++ b/inst/extdata/OSD/S/SCOTTY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively to well", - "drainage_overview": "somewhat excessively to well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SCRIVER.json b/inst/extdata/OSD/S/SCRIVER.json index 6a00f0b924..f1ffa4f8c3 100644 --- a/inst/extdata/OSD/S/SCRIVER.json +++ b/inst/extdata/OSD/S/SCRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SEAGATE.json b/inst/extdata/OSD/S/SEAGATE.json index 4cabdf0dce..90600253c8 100644 --- a/inst/extdata/OSD/S/SEAGATE.json +++ b/inst/extdata/OSD/S/SEAGATE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SEBEWA.json b/inst/extdata/OSD/S/SEBEWA.json index 891ed2b68a..d89737dbaf 100644 --- a/inst/extdata/OSD/S/SEBEWA.json +++ b/inst/extdata/OSD/S/SEBEWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SEBREE.json b/inst/extdata/OSD/S/SEBREE.json index 3c8ec182e6..bf78444905 100644 --- a/inst/extdata/OSD/S/SEBREE.json +++ b/inst/extdata/OSD/S/SEBREE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SECCA.json b/inst/extdata/OSD/S/SECCA.json index ffd35f4ab0..68e375b12a 100644 --- a/inst/extdata/OSD/S/SECCA.json +++ b/inst/extdata/OSD/S/SECCA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SECREST.json b/inst/extdata/OSD/S/SECREST.json index 561e8bb414..ad873b46fe 100644 --- a/inst/extdata/OSD/S/SECREST.json +++ b/inst/extdata/OSD/S/SECREST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SEDGEVILLE.json b/inst/extdata/OSD/S/SEDGEVILLE.json index d972a4d32e..be923d13cc 100644 --- a/inst/extdata/OSD/S/SEDGEVILLE.json +++ b/inst/extdata/OSD/S/SEDGEVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SEEDSKADEE.json b/inst/extdata/OSD/S/SEEDSKADEE.json index a0a747aa43..26554e4453 100644 --- a/inst/extdata/OSD/S/SEEDSKADEE.json +++ b/inst/extdata/OSD/S/SEEDSKADEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SEELEZ.json b/inst/extdata/OSD/S/SEELEZ.json index 42887e7974..4528228336 100644 --- a/inst/extdata/OSD/S/SEELEZ.json +++ b/inst/extdata/OSD/S/SEELEZ.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SELLMAN.json b/inst/extdata/OSD/S/SELLMAN.json index 798d9d9d98..8726f244df 100644 --- a/inst/extdata/OSD/S/SELLMAN.json +++ b/inst/extdata/OSD/S/SELLMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SEMINOLE.json b/inst/extdata/OSD/S/SEMINOLE.json index abdad8a7b2..ee47de40c5 100644 --- a/inst/extdata/OSD/S/SEMINOLE.json +++ b/inst/extdata/OSD/S/SEMINOLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SESPE.json b/inst/extdata/OSD/S/SESPE.json index 4eebceb070..f504466052 100644 --- a/inst/extdata/OSD/S/SESPE.json +++ b/inst/extdata/OSD/S/SESPE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SETTERS.json b/inst/extdata/OSD/S/SETTERS.json index 8f3244a725..8658136dde 100644 --- a/inst/extdata/OSD/S/SETTERS.json +++ b/inst/extdata/OSD/S/SETTERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SEVAL.json b/inst/extdata/OSD/S/SEVAL.json index 7c72954208..f54401043d 100644 --- a/inst/extdata/OSD/S/SEVAL.json +++ b/inst/extdata/OSD/S/SEVAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHAKAN.json b/inst/extdata/OSD/S/SHAKAN.json index 6700b796ae..045a917ad5 100644 --- a/inst/extdata/OSD/S/SHAKAN.json +++ b/inst/extdata/OSD/S/SHAKAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "moderately well to well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SHAMEL.json b/inst/extdata/OSD/S/SHAMEL.json index c90aee4c0c..cc44ee8b9a 100644 --- a/inst/extdata/OSD/S/SHAMEL.json +++ b/inst/extdata/OSD/S/SHAMEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHANDEP.json b/inst/extdata/OSD/S/SHANDEP.json index 73ea822601..e2f12d85f7 100644 --- a/inst/extdata/OSD/S/SHANDEP.json +++ b/inst/extdata/OSD/S/SHANDEP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHANKLER.json b/inst/extdata/OSD/S/SHANKLER.json index 602d4474cc..88c6ccc2de 100644 --- a/inst/extdata/OSD/S/SHANKLER.json +++ b/inst/extdata/OSD/S/SHANKLER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SHANNOCK.json b/inst/extdata/OSD/S/SHANNOCK.json index 8d844aef5a..c649051954 100644 --- a/inst/extdata/OSD/S/SHANNOCK.json +++ b/inst/extdata/OSD/S/SHANNOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SHARKEY.json b/inst/extdata/OSD/S/SHARKEY.json index 421b2fa7e9..a2b7603e49 100644 --- a/inst/extdata/OSD/S/SHARKEY.json +++ b/inst/extdata/OSD/S/SHARKEY.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "poorly and very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHARLAND.json b/inst/extdata/OSD/S/SHARLAND.json index 7adf34b9a8..216be8362c 100644 --- a/inst/extdata/OSD/S/SHARLAND.json +++ b/inst/extdata/OSD/S/SHARLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHATTUCK.json b/inst/extdata/OSD/S/SHATTUCK.json index 823a6ba1a8..5008e66045 100644 --- a/inst/extdata/OSD/S/SHATTUCK.json +++ b/inst/extdata/OSD/S/SHATTUCK.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SHAWA.json b/inst/extdata/OSD/S/SHAWA.json index ef7e3472e3..df8385a8a7 100644 --- a/inst/extdata/OSD/S/SHAWA.json +++ b/inst/extdata/OSD/S/SHAWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SHEDD.json b/inst/extdata/OSD/S/SHEDD.json index a99a94a37c..81c38e4abb 100644 --- a/inst/extdata/OSD/S/SHEDD.json +++ b/inst/extdata/OSD/S/SHEDD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SHELL.json b/inst/extdata/OSD/S/SHELL.json index 58c8873c94..16112d49ee 100644 --- a/inst/extdata/OSD/S/SHELL.json +++ b/inst/extdata/OSD/S/SHELL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHELLBLUFF.json b/inst/extdata/OSD/S/SHELLBLUFF.json index d2f5911f00..3a39157453 100644 --- a/inst/extdata/OSD/S/SHELLBLUFF.json +++ b/inst/extdata/OSD/S/SHELLBLUFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SHELLEY.json b/inst/extdata/OSD/S/SHELLEY.json index 8c859f217c..2c1b45240b 100644 --- a/inst/extdata/OSD/S/SHELLEY.json +++ b/inst/extdata/OSD/S/SHELLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively to excessively", - "drainage_overview": "somewhat excessively to excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/S/SHERANDO.json b/inst/extdata/OSD/S/SHERANDO.json index 636a32d4ba..ae114a31e8 100644 --- a/inst/extdata/OSD/S/SHERANDO.json +++ b/inst/extdata/OSD/S/SHERANDO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SHERBURNE.json b/inst/extdata/OSD/S/SHERBURNE.json index 3c63a196ad..1cd5a3a08a 100644 --- a/inst/extdata/OSD/S/SHERBURNE.json +++ b/inst/extdata/OSD/S/SHERBURNE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHERDAHL.json b/inst/extdata/OSD/S/SHERDAHL.json index 2ee1465b9c..9dfe6dc89c 100644 --- a/inst/extdata/OSD/S/SHERDAHL.json +++ b/inst/extdata/OSD/S/SHERDAHL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHERIDAN.json b/inst/extdata/OSD/S/SHERIDAN.json index fccb52c5ee..71c6b4cfc3 100644 --- a/inst/extdata/OSD/S/SHERIDAN.json +++ b/inst/extdata/OSD/S/SHERIDAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SHERRY.json b/inst/extdata/OSD/S/SHERRY.json index c978e68ee7..db5ddc8a15 100644 --- a/inst/extdata/OSD/S/SHERRY.json +++ b/inst/extdata/OSD/S/SHERRY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHERRYL.json b/inst/extdata/OSD/S/SHERRYL.json index 4dd1147897..9148503411 100644 --- a/inst/extdata/OSD/S/SHERRYL.json +++ b/inst/extdata/OSD/S/SHERRYL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHILOH.json b/inst/extdata/OSD/S/SHILOH.json index cf7680157b..fb2d6c4b8e 100644 --- a/inst/extdata/OSD/S/SHILOH.json +++ b/inst/extdata/OSD/S/SHILOH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHINGLEHOUSE.json b/inst/extdata/OSD/S/SHINGLEHOUSE.json index c76cfb29db..a6cfaf845b 100644 --- a/inst/extdata/OSD/S/SHINGLEHOUSE.json +++ b/inst/extdata/OSD/S/SHINGLEHOUSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or moderately well", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHINUME.json b/inst/extdata/OSD/S/SHINUME.json index 6b2942302a..fc57d62c19 100644 --- a/inst/extdata/OSD/S/SHINUME.json +++ b/inst/extdata/OSD/S/SHINUME.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively to well", + "drainage": "somewhat excessively, well", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/S/SHIPROCK.json b/inst/extdata/OSD/S/SHIPROCK.json index 0b15d12299..2143fdcc3b 100644 --- a/inst/extdata/OSD/S/SHIPROCK.json +++ b/inst/extdata/OSD/S/SHIPROCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SHIPS.json b/inst/extdata/OSD/S/SHIPS.json index caa325b3ef..5c2e8bcf08 100644 --- a/inst/extdata/OSD/S/SHIPS.json +++ b/inst/extdata/OSD/S/SHIPS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SHIRLEY.json b/inst/extdata/OSD/S/SHIRLEY.json index 2ed14f8a67..bd9939a62f 100644 --- a/inst/extdata/OSD/S/SHIRLEY.json +++ b/inst/extdata/OSD/S/SHIRLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHOALWATER.json b/inst/extdata/OSD/S/SHOALWATER.json index a576664996..24437fd7c1 100644 --- a/inst/extdata/OSD/S/SHOALWATER.json +++ b/inst/extdata/OSD/S/SHOALWATER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/S/SHOREWOOD.json b/inst/extdata/OSD/S/SHOREWOOD.json index a1f99c071f..c16c9eab1f 100644 --- a/inst/extdata/OSD/S/SHOREWOOD.json +++ b/inst/extdata/OSD/S/SHOREWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHORTNAP.json b/inst/extdata/OSD/S/SHORTNAP.json index f673416452..5431b98c6e 100644 --- a/inst/extdata/OSD/S/SHORTNAP.json +++ b/inst/extdata/OSD/S/SHORTNAP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/S/SHOSHONE.json b/inst/extdata/OSD/S/SHOSHONE.json index a0fe37cba8..11e18c7873 100644 --- a/inst/extdata/OSD/S/SHOSHONE.json +++ b/inst/extdata/OSD/S/SHOSHONE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly or poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/S/SHOWALTER.json b/inst/extdata/OSD/S/SHOWALTER.json index 4d26dca7db..655359bb9f 100644 --- a/inst/extdata/OSD/S/SHOWALTER.json +++ b/inst/extdata/OSD/S/SHOWALTER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SHREWSBURY.json b/inst/extdata/OSD/S/SHREWSBURY.json index 1ec3691954..e0ce383b62 100644 --- a/inst/extdata/OSD/S/SHREWSBURY.json +++ b/inst/extdata/OSD/S/SHREWSBURY.json @@ -65,7 +65,7 @@ [ { "drainage": "", - "drainage_overview": "" + "drainage_overview": "poorly" } ] ], diff --git a/inst/extdata/OSD/S/SIBBETT.json b/inst/extdata/OSD/S/SIBBETT.json index 25025589d2..095c0b796d 100644 --- a/inst/extdata/OSD/S/SIBBETT.json +++ b/inst/extdata/OSD/S/SIBBETT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/S/SICKLES.json b/inst/extdata/OSD/S/SICKLES.json index 6439936dec..3e41d05ed4 100644 --- a/inst/extdata/OSD/S/SICKLES.json +++ b/inst/extdata/OSD/S/SICKLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SIDEHILL.json b/inst/extdata/OSD/S/SIDEHILL.json index 6aed8a2eac..4000219c27 100644 --- a/inst/extdata/OSD/S/SIDEHILL.json +++ b/inst/extdata/OSD/S/SIDEHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SIERRAVILLE.json b/inst/extdata/OSD/S/SIERRAVILLE.json index 52271711a6..b059003922 100644 --- a/inst/extdata/OSD/S/SIERRAVILLE.json +++ b/inst/extdata/OSD/S/SIERRAVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SIEVERS.json b/inst/extdata/OSD/S/SIEVERS.json index e2ba37c3c0..67690221c3 100644 --- a/inst/extdata/OSD/S/SIEVERS.json +++ b/inst/extdata/OSD/S/SIEVERS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/S/SILVERCLIFF.json b/inst/extdata/OSD/S/SILVERCLIFF.json index ad04548a65..7418771c97 100644 --- a/inst/extdata/OSD/S/SILVERCLIFF.json +++ b/inst/extdata/OSD/S/SILVERCLIFF.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SIMMONT.json b/inst/extdata/OSD/S/SIMMONT.json index e7137a7f6e..6e1ed9be70 100644 --- a/inst/extdata/OSD/S/SIMMONT.json +++ b/inst/extdata/OSD/S/SIMMONT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to excessively", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SIMS.json b/inst/extdata/OSD/S/SIMS.json index 89117dc9d0..a40b3e6b34 100644 --- a/inst/extdata/OSD/S/SIMS.json +++ b/inst/extdata/OSD/S/SIMS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SINAI.json b/inst/extdata/OSD/S/SINAI.json index 340b74a097..c967a4dba4 100644 --- a/inst/extdata/OSD/S/SINAI.json +++ b/inst/extdata/OSD/S/SINAI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SINAMOX.json b/inst/extdata/OSD/S/SINAMOX.json index be8801baf8..2295144673 100644 --- a/inst/extdata/OSD/S/SINAMOX.json +++ b/inst/extdata/OSD/S/SINAMOX.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SINEPUXENT.json b/inst/extdata/OSD/S/SINEPUXENT.json index 5f8c09f7e3..ebf41529b1 100644 --- a/inst/extdata/OSD/S/SINEPUXENT.json +++ b/inst/extdata/OSD/S/SINEPUXENT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SINONA.json b/inst/extdata/OSD/S/SINONA.json index b3fb1c5632..7ac1b92094 100644 --- a/inst/extdata/OSD/S/SINONA.json +++ b/inst/extdata/OSD/S/SINONA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/S/SITES.json b/inst/extdata/OSD/S/SITES.json index 3f82f58f0f..7a4c201ad1 100644 --- a/inst/extdata/OSD/S/SITES.json +++ b/inst/extdata/OSD/S/SITES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SIXMILE.json b/inst/extdata/OSD/S/SIXMILE.json index 81056bc177..6374003259 100644 --- a/inst/extdata/OSD/S/SIXMILE.json +++ b/inst/extdata/OSD/S/SIXMILE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SIZER.json b/inst/extdata/OSD/S/SIZER.json index 23f4194029..9e5d8493de 100644 --- a/inst/extdata/OSD/S/SIZER.json +++ b/inst/extdata/OSD/S/SIZER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SKIDMORE.json b/inst/extdata/OSD/S/SKIDMORE.json index 007a3f74ea..4f58dc2c12 100644 --- a/inst/extdata/OSD/S/SKIDMORE.json +++ b/inst/extdata/OSD/S/SKIDMORE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SKOWHEGAN.json b/inst/extdata/OSD/S/SKOWHEGAN.json index c008596b58..55340d752a 100644 --- a/inst/extdata/OSD/S/SKOWHEGAN.json +++ b/inst/extdata/OSD/S/SKOWHEGAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SKUTUM.json b/inst/extdata/OSD/S/SKUTUM.json index bcd98044e6..618333fb9d 100644 --- a/inst/extdata/OSD/S/SKUTUM.json +++ b/inst/extdata/OSD/S/SKUTUM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SKYLAND.json b/inst/extdata/OSD/S/SKYLAND.json index d41cd7d482..1c8dc05f66 100644 --- a/inst/extdata/OSD/S/SKYLAND.json +++ b/inst/extdata/OSD/S/SKYLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SKYLICK.json b/inst/extdata/OSD/S/SKYLICK.json index b7a518e5ae..1d52086273 100644 --- a/inst/extdata/OSD/S/SKYLICK.json +++ b/inst/extdata/OSD/S/SKYLICK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SKYLIGHT.json b/inst/extdata/OSD/S/SKYLIGHT.json index 877d60145a..add85ce23e 100644 --- a/inst/extdata/OSD/S/SKYLIGHT.json +++ b/inst/extdata/OSD/S/SKYLIGHT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively and excessively", - "drainage_overview": "somewhat excessively and excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/S/SKYLINE.json b/inst/extdata/OSD/S/SKYLINE.json index a02b300ee8..782a318ef3 100644 --- a/inst/extdata/OSD/S/SKYLINE.json +++ b/inst/extdata/OSD/S/SKYLINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SKYMOR.json b/inst/extdata/OSD/S/SKYMOR.json index 506e5852fb..87f66f952e 100644 --- a/inst/extdata/OSD/S/SKYMOR.json +++ b/inst/extdata/OSD/S/SKYMOR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SLIPMAN.json b/inst/extdata/OSD/S/SLIPMAN.json index 25560fa33b..e21a4de542 100644 --- a/inst/extdata/OSD/S/SLIPMAN.json +++ b/inst/extdata/OSD/S/SLIPMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SLUICE.json b/inst/extdata/OSD/S/SLUICE.json index 35a5b0c2b1..6361840272 100644 --- a/inst/extdata/OSD/S/SLUICE.json +++ b/inst/extdata/OSD/S/SLUICE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SMILEY.json b/inst/extdata/OSD/S/SMILEY.json index 55dbe906a8..fd07238005 100644 --- a/inst/extdata/OSD/S/SMILEY.json +++ b/inst/extdata/OSD/S/SMILEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SMOKEHOUSE.json b/inst/extdata/OSD/S/SMOKEHOUSE.json index 88856ed237..5ef9367713 100644 --- a/inst/extdata/OSD/S/SMOKEHOUSE.json +++ b/inst/extdata/OSD/S/SMOKEHOUSE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SMOLAN.json b/inst/extdata/OSD/S/SMOLAN.json index ba100da35d..64db62a2ae 100644 --- a/inst/extdata/OSD/S/SMOLAN.json +++ b/inst/extdata/OSD/S/SMOLAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SMYRNA.json b/inst/extdata/OSD/S/SMYRNA.json index cb59efb75c..cd52706f14 100644 --- a/inst/extdata/OSD/S/SMYRNA.json +++ b/inst/extdata/OSD/S/SMYRNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly to very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SNAG.json b/inst/extdata/OSD/S/SNAG.json index d72cc865c7..b9a6a8a3bb 100644 --- a/inst/extdata/OSD/S/SNAG.json +++ b/inst/extdata/OSD/S/SNAG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SNAPP.json b/inst/extdata/OSD/S/SNAPP.json index 2e211c6f6a..10c88978e5 100644 --- a/inst/extdata/OSD/S/SNAPP.json +++ b/inst/extdata/OSD/S/SNAPP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SNOWDANCE.json b/inst/extdata/OSD/S/SNOWDANCE.json index d9d69963d2..63132ea6d3 100644 --- a/inst/extdata/OSD/S/SNOWDANCE.json +++ b/inst/extdata/OSD/S/SNOWDANCE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SNOWVILLE.json b/inst/extdata/OSD/S/SNOWVILLE.json index eecf9a6dfc..51d572e253 100644 --- a/inst/extdata/OSD/S/SNOWVILLE.json +++ b/inst/extdata/OSD/S/SNOWVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SODAWELLS.json b/inst/extdata/OSD/S/SODAWELLS.json index 975aaaee64..c8f178f12a 100644 --- a/inst/extdata/OSD/S/SODAWELLS.json +++ b/inst/extdata/OSD/S/SODAWELLS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SOFIA.json b/inst/extdata/OSD/S/SOFIA.json index e467cafa47..e20735ad58 100644 --- a/inst/extdata/OSD/S/SOFIA.json +++ b/inst/extdata/OSD/S/SOFIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SOGI.json b/inst/extdata/OSD/S/SOGI.json index 5bbcd8a693..ca556b14b0 100644 --- a/inst/extdata/OSD/S/SOGI.json +++ b/inst/extdata/OSD/S/SOGI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SOLDIER.json b/inst/extdata/OSD/S/SOLDIER.json index b425a1f748..bbde05c919 100644 --- a/inst/extdata/OSD/S/SOLDIER.json +++ b/inst/extdata/OSD/S/SOLDIER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SOO.json b/inst/extdata/OSD/S/SOO.json index 63be676044..76bf85cfc4 100644 --- a/inst/extdata/OSD/S/SOO.json +++ b/inst/extdata/OSD/S/SOO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SORF.json b/inst/extdata/OSD/S/SORF.json index 4df249d956..be0cabe0b9 100644 --- a/inst/extdata/OSD/S/SORF.json +++ b/inst/extdata/OSD/S/SORF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SOUTHFORK.json b/inst/extdata/OSD/S/SOUTHFORK.json index 82fa0276cb..6a06fee18f 100644 --- a/inst/extdata/OSD/S/SOUTHFORK.json +++ b/inst/extdata/OSD/S/SOUTHFORK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SOUTHPOINT.json b/inst/extdata/OSD/S/SOUTHPOINT.json index 446370d7f1..30510d15ea 100644 --- a/inst/extdata/OSD/S/SOUTHPOINT.json +++ b/inst/extdata/OSD/S/SOUTHPOINT.json @@ -65,7 +65,7 @@ [ { "drainage": "very poorly", - "drainage_overview": "" + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SOUTH_RIVER.json b/inst/extdata/OSD/S/SOUTH_RIVER.json index 077e24993d..b6a8728c6d 100644 --- a/inst/extdata/OSD/S/SOUTH_RIVER.json +++ b/inst/extdata/OSD/S/SOUTH_RIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/S/SOWEGO.json b/inst/extdata/OSD/S/SOWEGO.json index 222e34f16b..158f950f2d 100644 --- a/inst/extdata/OSD/S/SOWEGO.json +++ b/inst/extdata/OSD/S/SOWEGO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SPANEL.json b/inst/extdata/OSD/S/SPANEL.json index ae4da5819c..e7c8ab8a73 100644 --- a/inst/extdata/OSD/S/SPANEL.json +++ b/inst/extdata/OSD/S/SPANEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SPANGENBURG.json b/inst/extdata/OSD/S/SPANGENBURG.json index 931ce8edbf..f8d5ef1502 100644 --- a/inst/extdata/OSD/S/SPANGENBURG.json +++ b/inst/extdata/OSD/S/SPANGENBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SPARTABUTTE.json b/inst/extdata/OSD/S/SPARTABUTTE.json index 70c92c59c4..1e7059170f 100644 --- a/inst/extdata/OSD/S/SPARTABUTTE.json +++ b/inst/extdata/OSD/S/SPARTABUTTE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SPEARFISH.json b/inst/extdata/OSD/S/SPEARFISH.json index 3074f3edfc..a7c0b53a0c 100644 --- a/inst/extdata/OSD/S/SPEARFISH.json +++ b/inst/extdata/OSD/S/SPEARFISH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/SPEARMAN.json b/inst/extdata/OSD/S/SPEARMAN.json index c75fc12b9f..df92431ad0 100644 --- a/inst/extdata/OSD/S/SPEARMAN.json +++ b/inst/extdata/OSD/S/SPEARMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SPEARVILLE.json b/inst/extdata/OSD/S/SPEARVILLE.json index 1eb23ae224..e812bb634a 100644 --- a/inst/extdata/OSD/S/SPEARVILLE.json +++ b/inst/extdata/OSD/S/SPEARVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SPERRY.json b/inst/extdata/OSD/S/SPERRY.json index 30cd3eeaa0..16bd3886aa 100644 --- a/inst/extdata/OSD/S/SPERRY.json +++ b/inst/extdata/OSD/S/SPERRY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SPICER.json b/inst/extdata/OSD/S/SPICER.json index 912c6029a4..9e0ba967de 100644 --- a/inst/extdata/OSD/S/SPICER.json +++ b/inst/extdata/OSD/S/SPICER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SPICERTON.json b/inst/extdata/OSD/S/SPICERTON.json index 46ea723467..b1a2f3df0c 100644 --- a/inst/extdata/OSD/S/SPICERTON.json +++ b/inst/extdata/OSD/S/SPICERTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to moderately well", - "drainage_overview": "well to moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SPIKEBOX.json b/inst/extdata/OSD/S/SPIKEBOX.json index 3d84b1d172..6f2c00d367 100644 --- a/inst/extdata/OSD/S/SPIKEBOX.json +++ b/inst/extdata/OSD/S/SPIKEBOX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SPILLCO.json b/inst/extdata/OSD/S/SPILLCO.json index 31daa0e447..2650d1d5ce 100644 --- a/inst/extdata/OSD/S/SPILLCO.json +++ b/inst/extdata/OSD/S/SPILLCO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SPILLVILLE.json b/inst/extdata/OSD/S/SPILLVILLE.json index 9c9c0ea5d8..011a2b451c 100644 --- a/inst/extdata/OSD/S/SPILLVILLE.json +++ b/inst/extdata/OSD/S/SPILLVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SPIRES.json b/inst/extdata/OSD/S/SPIRES.json index 2d58835430..07e9a2cf3a 100644 --- a/inst/extdata/OSD/S/SPIRES.json +++ b/inst/extdata/OSD/S/SPIRES.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SPLENDORA.json b/inst/extdata/OSD/S/SPLENDORA.json index 624f0b81ce..bac1d24336 100644 --- a/inst/extdata/OSD/S/SPLENDORA.json +++ b/inst/extdata/OSD/S/SPLENDORA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SPOKANE.json b/inst/extdata/OSD/S/SPOKANE.json index 5c051a561e..0151901daf 100644 --- a/inst/extdata/OSD/S/SPOKANE.json +++ b/inst/extdata/OSD/S/SPOKANE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SPOOLSVILLE.json b/inst/extdata/OSD/S/SPOOLSVILLE.json index 770161caaa..1578765da0 100644 --- a/inst/extdata/OSD/S/SPOOLSVILLE.json +++ b/inst/extdata/OSD/S/SPOOLSVILLE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SPRAGUERIVER.json b/inst/extdata/OSD/S/SPRAGUERIVER.json index 1372225af6..4cf43be935 100644 --- a/inst/extdata/OSD/S/SPRAGUERIVER.json +++ b/inst/extdata/OSD/S/SPRAGUERIVER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/S/SPRINGMEADOW.json b/inst/extdata/OSD/S/SPRINGMEADOW.json index 022a7f7251..2816a20ba6 100644 --- a/inst/extdata/OSD/S/SPRINGMEADOW.json +++ b/inst/extdata/OSD/S/SPRINGMEADOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/S/SQUATTERFLAT.json b/inst/extdata/OSD/S/SQUATTERFLAT.json index f1d8483736..394536bae6 100644 --- a/inst/extdata/OSD/S/SQUATTERFLAT.json +++ b/inst/extdata/OSD/S/SQUATTERFLAT.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/ST._GEORGE.json b/inst/extdata/OSD/S/ST._GEORGE.json index 55dc862949..d398494219 100644 --- a/inst/extdata/OSD/S/ST._GEORGE.json +++ b/inst/extdata/OSD/S/ST._GEORGE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/ST._JOHNS.json b/inst/extdata/OSD/S/ST._JOHNS.json index 19af1c3cad..22256a7e5a 100644 --- a/inst/extdata/OSD/S/ST._JOHNS.json +++ b/inst/extdata/OSD/S/ST._JOHNS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/ST._ONGE.json b/inst/extdata/OSD/S/ST._ONGE.json index e5451b129d..8d05c74d93 100644 --- a/inst/extdata/OSD/S/ST._ONGE.json +++ b/inst/extdata/OSD/S/ST._ONGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/STALTER.json b/inst/extdata/OSD/S/STALTER.json index 4a721e8bbd..a834f5010e 100644 --- a/inst/extdata/OSD/S/STALTER.json +++ b/inst/extdata/OSD/S/STALTER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/STAVELY.json b/inst/extdata/OSD/S/STAVELY.json index 30a9738694..cc00abc3c1 100644 --- a/inst/extdata/OSD/S/STAVELY.json +++ b/inst/extdata/OSD/S/STAVELY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/STEED.json b/inst/extdata/OSD/S/STEED.json index 68b3c9ff36..4c7e90cf7e 100644 --- a/inst/extdata/OSD/S/STEED.json +++ b/inst/extdata/OSD/S/STEED.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/STEEDMAN.json b/inst/extdata/OSD/S/STEEDMAN.json index e188f2fef8..e64bcfc4ab 100644 --- a/inst/extdata/OSD/S/STEEDMAN.json +++ b/inst/extdata/OSD/S/STEEDMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/STEEKEE.json b/inst/extdata/OSD/S/STEEKEE.json index 8d64426305..9344ba51b5 100644 --- a/inst/extdata/OSD/S/STEEKEE.json +++ b/inst/extdata/OSD/S/STEEKEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/STEPHEN.json b/inst/extdata/OSD/S/STEPHEN.json index e299d90ebf..b0b491ca28 100644 --- a/inst/extdata/OSD/S/STEPHEN.json +++ b/inst/extdata/OSD/S/STEPHEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/STEPROCK.json b/inst/extdata/OSD/S/STEPROCK.json index cbe722ccfb..0cc68973ae 100644 --- a/inst/extdata/OSD/S/STEPROCK.json +++ b/inst/extdata/OSD/S/STEPROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/STERLING.json b/inst/extdata/OSD/S/STERLING.json index 2d2627db8a..8ed5c18390 100644 --- a/inst/extdata/OSD/S/STERLING.json +++ b/inst/extdata/OSD/S/STERLING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/STETSON.json b/inst/extdata/OSD/S/STETSON.json index 8c513d037f..1284f695c6 100644 --- a/inst/extdata/OSD/S/STETSON.json +++ b/inst/extdata/OSD/S/STETSON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/STEVENSGULCH.json b/inst/extdata/OSD/S/STEVENSGULCH.json index 27564f9feb..d81db91b3c 100644 --- a/inst/extdata/OSD/S/STEVENSGULCH.json +++ b/inst/extdata/OSD/S/STEVENSGULCH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/STIRK.json b/inst/extdata/OSD/S/STIRK.json index 5a7ba40348..9618a50c2d 100644 --- a/inst/extdata/OSD/S/STIRK.json +++ b/inst/extdata/OSD/S/STIRK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/STIRUM.json b/inst/extdata/OSD/S/STIRUM.json index fe9f7b9f73..7dce306866 100644 --- a/inst/extdata/OSD/S/STIRUM.json +++ b/inst/extdata/OSD/S/STIRUM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/STITHUM.json b/inst/extdata/OSD/S/STITHUM.json index dda68c2748..0831e32448 100644 --- a/inst/extdata/OSD/S/STITHUM.json +++ b/inst/extdata/OSD/S/STITHUM.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/STORLA.json b/inst/extdata/OSD/S/STORLA.json index f9f262bb32..c336009734 100644 --- a/inst/extdata/OSD/S/STORLA.json +++ b/inst/extdata/OSD/S/STORLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/STORMITT.json b/inst/extdata/OSD/S/STORMITT.json index 1384c73c94..9dfa0f02bf 100644 --- a/inst/extdata/OSD/S/STORMITT.json +++ b/inst/extdata/OSD/S/STORMITT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/STOUT.json b/inst/extdata/OSD/S/STOUT.json index 6e04c53cb1..696d5cee1f 100644 --- a/inst/extdata/OSD/S/STOUT.json +++ b/inst/extdata/OSD/S/STOUT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/S/STRATHCONA.json b/inst/extdata/OSD/S/STRATHCONA.json index 61d4e74144..3fd56aa38e 100644 --- a/inst/extdata/OSD/S/STRATHCONA.json +++ b/inst/extdata/OSD/S/STRATHCONA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/STRAW.json b/inst/extdata/OSD/S/STRAW.json index 9cd4c586b4..64879c5dcc 100644 --- a/inst/extdata/OSD/S/STRAW.json +++ b/inst/extdata/OSD/S/STRAW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/STREVELL.json b/inst/extdata/OSD/S/STREVELL.json index 6476e68253..6776598d07 100644 --- a/inst/extdata/OSD/S/STREVELL.json +++ b/inst/extdata/OSD/S/STREVELL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/STUTTGART.json b/inst/extdata/OSD/S/STUTTGART.json index 84bb86d517..7339864c12 100644 --- a/inst/extdata/OSD/S/STUTTGART.json +++ b/inst/extdata/OSD/S/STUTTGART.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUBLETTE.json b/inst/extdata/OSD/S/SUBLETTE.json index 43e5e61818..d01321c7b9 100644 --- a/inst/extdata/OSD/S/SUBLETTE.json +++ b/inst/extdata/OSD/S/SUBLETTE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SUCCOTASH.json b/inst/extdata/OSD/S/SUCCOTASH.json index 6fe744be01..cb6762c049 100644 --- a/inst/extdata/OSD/S/SUCCOTASH.json +++ b/inst/extdata/OSD/S/SUCCOTASH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SUCHES.json b/inst/extdata/OSD/S/SUCHES.json index 179fa01fe1..69f0ba5bf1 100644 --- a/inst/extdata/OSD/S/SUCHES.json +++ b/inst/extdata/OSD/S/SUCHES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SUCKERCREEK.json b/inst/extdata/OSD/S/SUCKERCREEK.json index 6a32a9336b..a9e40037b0 100644 --- a/inst/extdata/OSD/S/SUCKERCREEK.json +++ b/inst/extdata/OSD/S/SUCKERCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUDBURY.json b/inst/extdata/OSD/S/SUDBURY.json index 71a23e4b42..578ddccc09 100644 --- a/inst/extdata/OSD/S/SUDBURY.json +++ b/inst/extdata/OSD/S/SUDBURY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUDPEAK.json b/inst/extdata/OSD/S/SUDPEAK.json index b1fe8413c4..0cf7c541c7 100644 --- a/inst/extdata/OSD/S/SUDPEAK.json +++ b/inst/extdata/OSD/S/SUDPEAK.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SUGUN.json b/inst/extdata/OSD/S/SUGUN.json index 89eee76b97..057ddddb03 100644 --- a/inst/extdata/OSD/S/SUGUN.json +++ b/inst/extdata/OSD/S/SUGUN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUMERDUCK.json b/inst/extdata/OSD/S/SUMERDUCK.json index 3bdb3939f1..6204e4d849 100644 --- a/inst/extdata/OSD/S/SUMERDUCK.json +++ b/inst/extdata/OSD/S/SUMERDUCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUMMIT.json b/inst/extdata/OSD/S/SUMMIT.json index 5e778940f3..fe988147b4 100644 --- a/inst/extdata/OSD/S/SUMMIT.json +++ b/inst/extdata/OSD/S/SUMMIT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUMMITVILLE.json b/inst/extdata/OSD/S/SUMMITVILLE.json index 3c4723fe06..cb13e3c0af 100644 --- a/inst/extdata/OSD/S/SUMMITVILLE.json +++ b/inst/extdata/OSD/S/SUMMITVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SUMTER.json b/inst/extdata/OSD/S/SUMTER.json index 2fa936ca26..4d8881aea2 100644 --- a/inst/extdata/OSD/S/SUMTER.json +++ b/inst/extdata/OSD/S/SUMTER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "moderately well or well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SUNEV.json b/inst/extdata/OSD/S/SUNEV.json index e6dbfdcd58..f611a72cce 100644 --- a/inst/extdata/OSD/S/SUNEV.json +++ b/inst/extdata/OSD/S/SUNEV.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SUNSET.json b/inst/extdata/OSD/S/SUNSET.json index 49ccaaf0c6..7fa6cf81a7 100644 --- a/inst/extdata/OSD/S/SUNSET.json +++ b/inst/extdata/OSD/S/SUNSET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUNSETCONE.json b/inst/extdata/OSD/S/SUNSETCONE.json index 606cf0c9a8..beec1db029 100644 --- a/inst/extdata/OSD/S/SUNSETCONE.json +++ b/inst/extdata/OSD/S/SUNSETCONE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SURPLUS.json b/inst/extdata/OSD/S/SURPLUS.json index b29e4bd697..b7c7f5393c 100644 --- a/inst/extdata/OSD/S/SURPLUS.json +++ b/inst/extdata/OSD/S/SURPLUS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SUTHERLAND.json b/inst/extdata/OSD/S/SUTHERLAND.json index 17b880591f..933a0552eb 100644 --- a/inst/extdata/OSD/S/SUTHERLAND.json +++ b/inst/extdata/OSD/S/SUTHERLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SUTPHEN.json b/inst/extdata/OSD/S/SUTPHEN.json index a42ff64a09..e42b7cdc6a 100644 --- a/inst/extdata/OSD/S/SUTPHEN.json +++ b/inst/extdata/OSD/S/SUTPHEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/S/SVEA.json b/inst/extdata/OSD/S/SVEA.json index 600d9cb8f5..84c05c47a7 100644 --- a/inst/extdata/OSD/S/SVEA.json +++ b/inst/extdata/OSD/S/SVEA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SWANBOY.json b/inst/extdata/OSD/S/SWANBOY.json index 9511eef07a..cbf9e1c03d 100644 --- a/inst/extdata/OSD/S/SWANBOY.json +++ b/inst/extdata/OSD/S/SWANBOY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "moderately well or well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SWANTON.json b/inst/extdata/OSD/S/SWANTON.json index fa6d03e821..eb0b715d6b 100644 --- a/inst/extdata/OSD/S/SWANTON.json +++ b/inst/extdata/OSD/S/SWANTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/S/SWARTSWOOD.json b/inst/extdata/OSD/S/SWARTSWOOD.json index e48b9f9133..8cb510c776 100644 --- a/inst/extdata/OSD/S/SWARTSWOOD.json +++ b/inst/extdata/OSD/S/SWARTSWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SWASEY.json b/inst/extdata/OSD/S/SWASEY.json index 9e143ce2e5..6e3e894fc0 100644 --- a/inst/extdata/OSD/S/SWASEY.json +++ b/inst/extdata/OSD/S/SWASEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SWEDNA.json b/inst/extdata/OSD/S/SWEDNA.json index 8a8cdfe468..a4a718e6cd 100644 --- a/inst/extdata/OSD/S/SWEDNA.json +++ b/inst/extdata/OSD/S/SWEDNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SWEEN.json b/inst/extdata/OSD/S/SWEEN.json index fadc8d5ca7..9b6e1751fb 100644 --- a/inst/extdata/OSD/S/SWEEN.json +++ b/inst/extdata/OSD/S/SWEEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SWEETCREEK.json b/inst/extdata/OSD/S/SWEETCREEK.json index f595b547d8..7fbd04597e 100644 --- a/inst/extdata/OSD/S/SWEETCREEK.json +++ b/inst/extdata/OSD/S/SWEETCREEK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/S/SWENODA.json b/inst/extdata/OSD/S/SWENODA.json index f8fe408745..ed857bfbc7 100644 --- a/inst/extdata/OSD/S/SWENODA.json +++ b/inst/extdata/OSD/S/SWENODA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SWIFTON.json b/inst/extdata/OSD/S/SWIFTON.json index 12cff765d4..29d44b4f4e 100644 --- a/inst/extdata/OSD/S/SWIFTON.json +++ b/inst/extdata/OSD/S/SWIFTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SWIFT_CREEK.json b/inst/extdata/OSD/S/SWIFT_CREEK.json index 986ddd7bbd..4aa75c5bba 100644 --- a/inst/extdata/OSD/S/SWIFT_CREEK.json +++ b/inst/extdata/OSD/S/SWIFT_CREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/S/SWILLNA.json b/inst/extdata/OSD/S/SWILLNA.json index d1b68aa758..de61273447 100644 --- a/inst/extdata/OSD/S/SWILLNA.json +++ b/inst/extdata/OSD/S/SWILLNA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/S/SWINT.json b/inst/extdata/OSD/S/SWINT.json index c036af679f..813978a140 100644 --- a/inst/extdata/OSD/S/SWINT.json +++ b/inst/extdata/OSD/S/SWINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/S/SWISBOB.json b/inst/extdata/OSD/S/SWISBOB.json index 235e71d850..96ad8fb965 100644 --- a/inst/extdata/OSD/S/SWISBOB.json +++ b/inst/extdata/OSD/S/SWISBOB.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/S/SYCOLINE.json b/inst/extdata/OSD/S/SYCOLINE.json index 4b05d39e67..ebf9cd9167 100644 --- a/inst/extdata/OSD/S/SYCOLINE.json +++ b/inst/extdata/OSD/S/SYCOLINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", - "drainage_overview": "moderately well to somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/S/SYRENE.json b/inst/extdata/OSD/S/SYRENE.json index c808be42a6..75a0623fda 100644 --- a/inst/extdata/OSD/S/SYRENE.json +++ b/inst/extdata/OSD/S/SYRENE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TABLE_MOUNTAIN.json b/inst/extdata/OSD/T/TABLE_MOUNTAIN.json index 9e8e7a7aa4..9406c6bf0b 100644 --- a/inst/extdata/OSD/T/TABLE_MOUNTAIN.json +++ b/inst/extdata/OSD/T/TABLE_MOUNTAIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TACAN.json b/inst/extdata/OSD/T/TACAN.json index c03d3ecf8f..7f0b1ec6bb 100644 --- a/inst/extdata/OSD/T/TACAN.json +++ b/inst/extdata/OSD/T/TACAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TADKEE.json b/inst/extdata/OSD/T/TADKEE.json index 15bcf3d8c8..7b3df53ff0 100644 --- a/inst/extdata/OSD/T/TADKEE.json +++ b/inst/extdata/OSD/T/TADKEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TAFUNA.json b/inst/extdata/OSD/T/TAFUNA.json index 92dc1ae6c1..eb8acbf5aa 100644 --- a/inst/extdata/OSD/T/TAFUNA.json +++ b/inst/extdata/OSD/T/TAFUNA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TAHQUATS.json b/inst/extdata/OSD/T/TAHQUATS.json index 4a97c6dd28..29829e4452 100644 --- a/inst/extdata/OSD/T/TAHQUATS.json +++ b/inst/extdata/OSD/T/TAHQUATS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TALAG.json b/inst/extdata/OSD/T/TALAG.json index 755bb9938e..4a4d351beb 100644 --- a/inst/extdata/OSD/T/TALAG.json +++ b/inst/extdata/OSD/T/TALAG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TALAWA.json b/inst/extdata/OSD/T/TALAWA.json index cc1b4aae88..a755ed73c1 100644 --- a/inst/extdata/OSD/T/TALAWA.json +++ b/inst/extdata/OSD/T/TALAWA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to very poorly", - "drainage_overview": "poorly to very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TALCOT.json b/inst/extdata/OSD/T/TALCOT.json index b9dd84aa77..7803cac7f7 100644 --- a/inst/extdata/OSD/T/TALCOT.json +++ b/inst/extdata/OSD/T/TALCOT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TALLAC.json b/inst/extdata/OSD/T/TALLAC.json index 41ab817d66..ebcdedd39a 100644 --- a/inst/extdata/OSD/T/TALLAC.json +++ b/inst/extdata/OSD/T/TALLAC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TALMOON.json b/inst/extdata/OSD/T/TALMOON.json index 1fe297a921..7fb378635d 100644 --- a/inst/extdata/OSD/T/TALMOON.json +++ b/inst/extdata/OSD/T/TALMOON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TALUWIK.json b/inst/extdata/OSD/T/TALUWIK.json index 53e75c845b..f8597720a5 100644 --- a/inst/extdata/OSD/T/TALUWIK.json +++ b/inst/extdata/OSD/T/TALUWIK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TAMELY.json b/inst/extdata/OSD/T/TAMELY.json index bbea95f251..cd94531140 100644 --- a/inst/extdata/OSD/T/TAMELY.json +++ b/inst/extdata/OSD/T/TAMELY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TAMRED.json b/inst/extdata/OSD/T/TAMRED.json index 170684e863..c6855e74e6 100644 --- a/inst/extdata/OSD/T/TAMRED.json +++ b/inst/extdata/OSD/T/TAMRED.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TANACROSS.json b/inst/extdata/OSD/T/TANACROSS.json index a90566efa1..48523a2014 100644 --- a/inst/extdata/OSD/T/TANACROSS.json +++ b/inst/extdata/OSD/T/TANACROSS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TANGOE.json b/inst/extdata/OSD/T/TANGOE.json index 6e589b0ef5..5180b5097c 100644 --- a/inst/extdata/OSD/T/TANGOE.json +++ b/inst/extdata/OSD/T/TANGOE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly or somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TASSEL.json b/inst/extdata/OSD/T/TASSEL.json index bc61acf6ca..1b6f8e92b7 100644 --- a/inst/extdata/OSD/T/TASSEL.json +++ b/inst/extdata/OSD/T/TASSEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TASSO.json b/inst/extdata/OSD/T/TASSO.json index 4b87ada72d..4af01213a7 100644 --- a/inst/extdata/OSD/T/TASSO.json +++ b/inst/extdata/OSD/T/TASSO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TATLANIKA.json b/inst/extdata/OSD/T/TATLANIKA.json index 9cfa8ba745..d3ad175151 100644 --- a/inst/extdata/OSD/T/TATLANIKA.json +++ b/inst/extdata/OSD/T/TATLANIKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or very poorly", - "drainage_overview": "poorly or very poorly" + "drainage": "very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TAWAH.json b/inst/extdata/OSD/T/TAWAH.json index 4f305d276b..5aae3fe10c 100644 --- a/inst/extdata/OSD/T/TAWAH.json +++ b/inst/extdata/OSD/T/TAWAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TAYLORSVILLE.json b/inst/extdata/OSD/T/TAYLORSVILLE.json index 93429aa855..0e3a407367 100644 --- a/inst/extdata/OSD/T/TAYLORSVILLE.json +++ b/inst/extdata/OSD/T/TAYLORSVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TEAPO.json b/inst/extdata/OSD/T/TEAPO.json index cefbff985f..cb02e72c9c 100644 --- a/inst/extdata/OSD/T/TEAPO.json +++ b/inst/extdata/OSD/T/TEAPO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TEA_HAMMOCK.json b/inst/extdata/OSD/T/TEA_HAMMOCK.json index df3deca4fb..5b2e2d9973 100644 --- a/inst/extdata/OSD/T/TEA_HAMMOCK.json +++ b/inst/extdata/OSD/T/TEA_HAMMOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TEHAMA.json b/inst/extdata/OSD/T/TEHAMA.json index f73d1f5f30..c3326e01b1 100644 --- a/inst/extdata/OSD/T/TEHAMA.json +++ b/inst/extdata/OSD/T/TEHAMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TELEMON.json b/inst/extdata/OSD/T/TELEMON.json index 23ca4d5b77..2fa1340188 100644 --- a/inst/extdata/OSD/T/TELEMON.json +++ b/inst/extdata/OSD/T/TELEMON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/T/TELEPHONE.json b/inst/extdata/OSD/T/TELEPHONE.json index e93b007fdf..cc955e1505 100644 --- a/inst/extdata/OSD/T/TELEPHONE.json +++ b/inst/extdata/OSD/T/TELEPHONE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TELF.json b/inst/extdata/OSD/T/TELF.json index 40e226e213..7bff401e1f 100644 --- a/inst/extdata/OSD/T/TELF.json +++ b/inst/extdata/OSD/T/TELF.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/T/TELFER.json b/inst/extdata/OSD/T/TELFER.json index 06135e7f10..79d81c238e 100644 --- a/inst/extdata/OSD/T/TELFER.json +++ b/inst/extdata/OSD/T/TELFER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively and somewhat excessively", - "drainage_overview": "excessively and somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/T/TEMESCAL.json b/inst/extdata/OSD/T/TEMESCAL.json index bb22650f0e..4f0abc595a 100644 --- a/inst/extdata/OSD/T/TEMESCAL.json +++ b/inst/extdata/OSD/T/TEMESCAL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TENRAG.json b/inst/extdata/OSD/T/TENRAG.json index a5aaf981e5..4e7c0d7f4e 100644 --- a/inst/extdata/OSD/T/TENRAG.json +++ b/inst/extdata/OSD/T/TENRAG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TERRIL.json b/inst/extdata/OSD/T/TERRIL.json index d36a892d10..36082755ca 100644 --- a/inst/extdata/OSD/T/TERRIL.json +++ b/inst/extdata/OSD/T/TERRIL.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TERTOO.json b/inst/extdata/OSD/T/TERTOO.json index 98dec413a2..e8ed98d019 100644 --- a/inst/extdata/OSD/T/TERTOO.json +++ b/inst/extdata/OSD/T/TERTOO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TESAJO.json b/inst/extdata/OSD/T/TESAJO.json index c8986bfddd..6f9af8f345 100644 --- a/inst/extdata/OSD/T/TESAJO.json +++ b/inst/extdata/OSD/T/TESAJO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat excessively", - "drainage_overview": "moderately well to somewhat excessively" + "drainage": "somewhat excessively, well, moderately well", + "drainage_overview": "somewhat excessively, well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TETONIA.json b/inst/extdata/OSD/T/TETONIA.json index f772b8793c..0550a522e4 100644 --- a/inst/extdata/OSD/T/TETONIA.json +++ b/inst/extdata/OSD/T/TETONIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TEX.json b/inst/extdata/OSD/T/TEX.json index 9107bfc152..5b4ae3c258 100644 --- a/inst/extdata/OSD/T/TEX.json +++ b/inst/extdata/OSD/T/TEX.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TEXANA.json b/inst/extdata/OSD/T/TEXANA.json index 7a06bd8344..64173ffec9 100644 --- a/inst/extdata/OSD/T/TEXANA.json +++ b/inst/extdata/OSD/T/TEXANA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/T/THAYNE.json b/inst/extdata/OSD/T/THAYNE.json index 52f36c04ef..7abd52930c 100644 --- a/inst/extdata/OSD/T/THAYNE.json +++ b/inst/extdata/OSD/T/THAYNE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/THIEFRIVER.json b/inst/extdata/OSD/T/THIEFRIVER.json index 08cb73d89b..25488ac554 100644 --- a/inst/extdata/OSD/T/THIEFRIVER.json +++ b/inst/extdata/OSD/T/THIEFRIVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/THIEL.json b/inst/extdata/OSD/T/THIEL.json index 59e538d034..95596dd647 100644 --- a/inst/extdata/OSD/T/THIEL.json +++ b/inst/extdata/OSD/T/THIEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/THOMAS.json b/inst/extdata/OSD/T/THOMAS.json index c6f6aa1a42..e111693633 100644 --- a/inst/extdata/OSD/T/THOMAS.json +++ b/inst/extdata/OSD/T/THOMAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/THOMS.json b/inst/extdata/OSD/T/THOMS.json index c9a5341854..c8788e1485 100644 --- a/inst/extdata/OSD/T/THOMS.json +++ b/inst/extdata/OSD/T/THOMS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/THREECABIN.json b/inst/extdata/OSD/T/THREECABIN.json index 05aa728e20..336efcad95 100644 --- a/inst/extdata/OSD/T/THREECABIN.json +++ b/inst/extdata/OSD/T/THREECABIN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/THREECENT.json b/inst/extdata/OSD/T/THREECENT.json index 31aab8a76d..b56f62987e 100644 --- a/inst/extdata/OSD/T/THREECENT.json +++ b/inst/extdata/OSD/T/THREECENT.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/THURLOW.json b/inst/extdata/OSD/T/THURLOW.json index 698097adb6..f407df6ec0 100644 --- a/inst/extdata/OSD/T/THURLOW.json +++ b/inst/extdata/OSD/T/THURLOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TICHNOR.json b/inst/extdata/OSD/T/TICHNOR.json index 7a6e220a09..04c4990b31 100644 --- a/inst/extdata/OSD/T/TICHNOR.json +++ b/inst/extdata/OSD/T/TICHNOR.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly or very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TICKAPOO.json b/inst/extdata/OSD/T/TICKAPOO.json index 9a69615aac..7c248e2298 100644 --- a/inst/extdata/OSD/T/TICKAPOO.json +++ b/inst/extdata/OSD/T/TICKAPOO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TIGIWON.json b/inst/extdata/OSD/T/TIGIWON.json index f5c925afba..1bcbd80965 100644 --- a/inst/extdata/OSD/T/TIGIWON.json +++ b/inst/extdata/OSD/T/TIGIWON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TILFER.json b/inst/extdata/OSD/T/TILFER.json index 62f5c38ce8..80beae0ab3 100644 --- a/inst/extdata/OSD/T/TILFER.json +++ b/inst/extdata/OSD/T/TILFER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TIMBLIN.json b/inst/extdata/OSD/T/TIMBLIN.json index 902863e052..d2d506a961 100644 --- a/inst/extdata/OSD/T/TIMBLIN.json +++ b/inst/extdata/OSD/T/TIMBLIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TIMPANOGOS.json b/inst/extdata/OSD/T/TIMPANOGOS.json index 590410719a..d8b7087f46 100644 --- a/inst/extdata/OSD/T/TIMPANOGOS.json +++ b/inst/extdata/OSD/T/TIMPANOGOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TINE.json b/inst/extdata/OSD/T/TINE.json index 8c4cc00052..f6d447111a 100644 --- a/inst/extdata/OSD/T/TINE.json +++ b/inst/extdata/OSD/T/TINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TINEMAN.json b/inst/extdata/OSD/T/TINEMAN.json index f8b6fbb92f..9332248864 100644 --- a/inst/extdata/OSD/T/TINEMAN.json +++ b/inst/extdata/OSD/T/TINEMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TINGEY.json b/inst/extdata/OSD/T/TINGEY.json index 7111c2aa32..099ecd5fc2 100644 --- a/inst/extdata/OSD/T/TINGEY.json +++ b/inst/extdata/OSD/T/TINGEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TINGLES.json b/inst/extdata/OSD/T/TINGLES.json index dcac6bcff2..f84d252959 100644 --- a/inst/extdata/OSD/T/TINGLES.json +++ b/inst/extdata/OSD/T/TINGLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TINKER.json b/inst/extdata/OSD/T/TINKER.json index 0e7b77a2a9..6267e4f666 100644 --- a/inst/extdata/OSD/T/TINKER.json +++ b/inst/extdata/OSD/T/TINKER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TINN.json b/inst/extdata/OSD/T/TINN.json index a59bafc49e..afd8e39f2d 100644 --- a/inst/extdata/OSD/T/TINN.json +++ b/inst/extdata/OSD/T/TINN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/T/TIPPER.json b/inst/extdata/OSD/T/TIPPER.json index 8684376453..de186fad25 100644 --- a/inst/extdata/OSD/T/TIPPER.json +++ b/inst/extdata/OSD/T/TIPPER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TIPPERARY.json b/inst/extdata/OSD/T/TIPPERARY.json index 2f9d9f0827..087b6b38fb 100644 --- a/inst/extdata/OSD/T/TIPPERARY.json +++ b/inst/extdata/OSD/T/TIPPERARY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat excessively", + "drainage": "excessively, somewhat excessively", "drainage_overview": "somewhat excessively" } ] diff --git a/inst/extdata/OSD/T/TITLOW.json b/inst/extdata/OSD/T/TITLOW.json index f48967ee72..65ed7fc9bf 100644 --- a/inst/extdata/OSD/T/TITLOW.json +++ b/inst/extdata/OSD/T/TITLOW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOBICO.json b/inst/extdata/OSD/T/TOBICO.json index 3ea52a5b17..8e6f66567c 100644 --- a/inst/extdata/OSD/T/TOBICO.json +++ b/inst/extdata/OSD/T/TOBICO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOBINCREEK.json b/inst/extdata/OSD/T/TOBINCREEK.json index baa3f66bdb..58b99beef2 100644 --- a/inst/extdata/OSD/T/TOBINCREEK.json +++ b/inst/extdata/OSD/T/TOBINCREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOBISH.json b/inst/extdata/OSD/T/TOBISH.json index 2ab943abf3..afe414805a 100644 --- a/inst/extdata/OSD/T/TOBISH.json +++ b/inst/extdata/OSD/T/TOBISH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOBLER.json b/inst/extdata/OSD/T/TOBLER.json index 66f658d7ec..c1abebb2a5 100644 --- a/inst/extdata/OSD/T/TOBLER.json +++ b/inst/extdata/OSD/T/TOBLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TOBOSA.json b/inst/extdata/OSD/T/TOBOSA.json index 814299bc5f..a5f9439b68 100644 --- a/inst/extdata/OSD/T/TOBOSA.json +++ b/inst/extdata/OSD/T/TOBOSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOCCOA.json b/inst/extdata/OSD/T/TOCCOA.json index c1e6559895..a9de29d787 100644 --- a/inst/extdata/OSD/T/TOCCOA.json +++ b/inst/extdata/OSD/T/TOCCOA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TODDLER.json b/inst/extdata/OSD/T/TODDLER.json index c752fe0752..fcd145d10c 100644 --- a/inst/extdata/OSD/T/TODDLER.json +++ b/inst/extdata/OSD/T/TODDLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TODOS.json b/inst/extdata/OSD/T/TODOS.json index d75b93c6fc..442c46c608 100644 --- a/inst/extdata/OSD/T/TODOS.json +++ b/inst/extdata/OSD/T/TODOS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOEBRANCH.json b/inst/extdata/OSD/T/TOEBRANCH.json index 70bc9cbe49..91ce213ee8 100644 --- a/inst/extdata/OSD/T/TOEBRANCH.json +++ b/inst/extdata/OSD/T/TOEBRANCH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TOINETTE.json b/inst/extdata/OSD/T/TOINETTE.json index 24a263f1a3..b3282acdfc 100644 --- a/inst/extdata/OSD/T/TOINETTE.json +++ b/inst/extdata/OSD/T/TOINETTE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TOKO.json b/inst/extdata/OSD/T/TOKO.json index d5c8707a11..38a1b07640 100644 --- a/inst/extdata/OSD/T/TOKO.json +++ b/inst/extdata/OSD/T/TOKO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOLLAND.json b/inst/extdata/OSD/T/TOLLAND.json index bbb69e011d..99a6f14fbb 100644 --- a/inst/extdata/OSD/T/TOLLAND.json +++ b/inst/extdata/OSD/T/TOLLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOLLHOUSE.json b/inst/extdata/OSD/T/TOLLHOUSE.json index a5070a1f7d..494b801f87 100644 --- a/inst/extdata/OSD/T/TOLLHOUSE.json +++ b/inst/extdata/OSD/T/TOLLHOUSE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat excessively or excessively", - "drainage_overview": "somewhat excessively or excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/T/TOLSONA.json b/inst/extdata/OSD/T/TOLSONA.json index 629dae9db3..e06204b0ed 100644 --- a/inst/extdata/OSD/T/TOLSONA.json +++ b/inst/extdata/OSD/T/TOLSONA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOLSTOI.json b/inst/extdata/OSD/T/TOLSTOI.json index 27893751c5..065a1145b6 100644 --- a/inst/extdata/OSD/T/TOLSTOI.json +++ b/inst/extdata/OSD/T/TOLSTOI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TOLUCA.json b/inst/extdata/OSD/T/TOLUCA.json index 789dd97a91..8e880ca737 100644 --- a/inst/extdata/OSD/T/TOLUCA.json +++ b/inst/extdata/OSD/T/TOLUCA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TOMAHAWK.json b/inst/extdata/OSD/T/TOMAHAWK.json index 9864f7e338..3423036cb1 100644 --- a/inst/extdata/OSD/T/TOMAHAWK.json +++ b/inst/extdata/OSD/T/TOMAHAWK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOMERA.json b/inst/extdata/OSD/T/TOMERA.json index 248d0e1450..2f4f29f375 100644 --- a/inst/extdata/OSD/T/TOMERA.json +++ b/inst/extdata/OSD/T/TOMERA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOMICHI.json b/inst/extdata/OSD/T/TOMICHI.json index 2864bc527a..994ee7afac 100644 --- a/inst/extdata/OSD/T/TOMICHI.json +++ b/inst/extdata/OSD/T/TOMICHI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TOMSHERRY.json b/inst/extdata/OSD/T/TOMSHERRY.json index 14ca2bcb3d..6d15a6153d 100644 --- a/inst/extdata/OSD/T/TOMSHERRY.json +++ b/inst/extdata/OSD/T/TOMSHERRY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TONEY.json b/inst/extdata/OSD/T/TONEY.json index 907638e82e..90789d4105 100644 --- a/inst/extdata/OSD/T/TONEY.json +++ b/inst/extdata/OSD/T/TONEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "moderately well", + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TONKEY.json b/inst/extdata/OSD/T/TONKEY.json index a4c627f296..9733373d22 100644 --- a/inst/extdata/OSD/T/TONKEY.json +++ b/inst/extdata/OSD/T/TONKEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TONKIN.json b/inst/extdata/OSD/T/TONKIN.json index 4afd301155..02be0df0f1 100644 --- a/inst/extdata/OSD/T/TONKIN.json +++ b/inst/extdata/OSD/T/TONKIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TONOPAH.json b/inst/extdata/OSD/T/TONOPAH.json index 797ab55ae6..99ccea2a9e 100644 --- a/inst/extdata/OSD/T/TONOPAH.json +++ b/inst/extdata/OSD/T/TONOPAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively to well", - "drainage_overview": "excessively to well" + "drainage": "excessively, somewhat excessively, well", + "drainage_overview": "excessively, somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TONRA.json b/inst/extdata/OSD/T/TONRA.json index cf7b93199b..7025f00391 100644 --- a/inst/extdata/OSD/T/TONRA.json +++ b/inst/extdata/OSD/T/TONRA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOOLES.json b/inst/extdata/OSD/T/TOOLES.json index 7eaeff2570..fd9b627db3 100644 --- a/inst/extdata/OSD/T/TOOLES.json +++ b/inst/extdata/OSD/T/TOOLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOOLESBORO.json b/inst/extdata/OSD/T/TOOLESBORO.json index a978cede08..3b38bc72b9 100644 --- a/inst/extdata/OSD/T/TOOLESBORO.json +++ b/inst/extdata/OSD/T/TOOLESBORO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and poorly", - "drainage_overview": "somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOOMES.json b/inst/extdata/OSD/T/TOOMES.json index b98152217d..f7139fb3e0 100644 --- a/inst/extdata/OSD/T/TOOMES.json +++ b/inst/extdata/OSD/T/TOOMES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TORCHLIGHT.json b/inst/extdata/OSD/T/TORCHLIGHT.json index 03382d3b38..749ab45918 100644 --- a/inst/extdata/OSD/T/TORCHLIGHT.json +++ b/inst/extdata/OSD/T/TORCHLIGHT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TORTUGAS.json b/inst/extdata/OSD/T/TORTUGAS.json index 8ab25f7353..39d10ffe79 100644 --- a/inst/extdata/OSD/T/TORTUGAS.json +++ b/inst/extdata/OSD/T/TORTUGAS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOSSUP.json b/inst/extdata/OSD/T/TOSSUP.json index 28eabe7943..97143494e1 100644 --- a/inst/extdata/OSD/T/TOSSUP.json +++ b/inst/extdata/OSD/T/TOSSUP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOTAGATIC.json b/inst/extdata/OSD/T/TOTAGATIC.json index 79c70f7f46..d97027f076 100644 --- a/inst/extdata/OSD/T/TOTAGATIC.json +++ b/inst/extdata/OSD/T/TOTAGATIC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOTATLANIKA.json b/inst/extdata/OSD/T/TOTATLANIKA.json index 850ef909d9..b251684858 100644 --- a/inst/extdata/OSD/T/TOTATLANIKA.json +++ b/inst/extdata/OSD/T/TOTATLANIKA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly or poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TOURS.json b/inst/extdata/OSD/T/TOURS.json index 95a59833cd..010df9a802 100644 --- a/inst/extdata/OSD/T/TOURS.json +++ b/inst/extdata/OSD/T/TOURS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TOUZALIN.json b/inst/extdata/OSD/T/TOUZALIN.json index 51f3dc9654..8d18f9620d 100644 --- a/inst/extdata/OSD/T/TOUZALIN.json +++ b/inst/extdata/OSD/T/TOUZALIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/T/TOWAOC.json b/inst/extdata/OSD/T/TOWAOC.json index 840dbc3684..4eb494adc1 100644 --- a/inst/extdata/OSD/T/TOWAOC.json +++ b/inst/extdata/OSD/T/TOWAOC.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TOWERMOUNTAIN.json b/inst/extdata/OSD/T/TOWERMOUNTAIN.json index ee99f1d168..e338de9b38 100644 --- a/inst/extdata/OSD/T/TOWERMOUNTAIN.json +++ b/inst/extdata/OSD/T/TOWERMOUNTAIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TOWNER.json b/inst/extdata/OSD/T/TOWNER.json index 81d5d58f20..a98a884e52 100644 --- a/inst/extdata/OSD/T/TOWNER.json +++ b/inst/extdata/OSD/T/TOWNER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TOXAWAY.json b/inst/extdata/OSD/T/TOXAWAY.json index 5dfcf185a7..cffa730e16 100644 --- a/inst/extdata/OSD/T/TOXAWAY.json +++ b/inst/extdata/OSD/T/TOXAWAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TRACOSA.json b/inst/extdata/OSD/T/TRACOSA.json index 0aeec8809e..8f346cc846 100644 --- a/inst/extdata/OSD/T/TRACOSA.json +++ b/inst/extdata/OSD/T/TRACOSA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/T/TRAER.json b/inst/extdata/OSD/T/TRAER.json index e3a78488a7..95bf1b40bf 100644 --- a/inst/extdata/OSD/T/TRAER.json +++ b/inst/extdata/OSD/T/TRAER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TRAIL.json b/inst/extdata/OSD/T/TRAIL.json index e192b56b7d..5af81c59ed 100644 --- a/inst/extdata/OSD/T/TRAIL.json +++ b/inst/extdata/OSD/T/TRAIL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TRAITORS.json b/inst/extdata/OSD/T/TRAITORS.json index 3bc5ea83e0..6bfe447943 100644 --- a/inst/extdata/OSD/T/TRAITORS.json +++ b/inst/extdata/OSD/T/TRAITORS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TRANSYLVANIA.json b/inst/extdata/OSD/T/TRANSYLVANIA.json index f1f5a1faa6..1a2732bdd3 100644 --- a/inst/extdata/OSD/T/TRANSYLVANIA.json +++ b/inst/extdata/OSD/T/TRANSYLVANIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TRAPPE.json b/inst/extdata/OSD/T/TRAPPE.json index a67162c86c..0df527aef6 100644 --- a/inst/extdata/OSD/T/TRAPPE.json +++ b/inst/extdata/OSD/T/TRAPPE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TRAVELERS.json b/inst/extdata/OSD/T/TRAVELERS.json index bb09e6169e..fdb9e0a812 100644 --- a/inst/extdata/OSD/T/TRAVELERS.json +++ b/inst/extdata/OSD/T/TRAVELERS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TRAVER.json b/inst/extdata/OSD/T/TRAVER.json index 78b3c08cb1..80f5fa8db2 100644 --- a/inst/extdata/OSD/T/TRAVER.json +++ b/inst/extdata/OSD/T/TRAVER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TRAY.json b/inst/extdata/OSD/T/TRAY.json index e8acf99c47..0399ccd4c8 100644 --- a/inst/extdata/OSD/T/TRAY.json +++ b/inst/extdata/OSD/T/TRAY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TREMBLES.json b/inst/extdata/OSD/T/TREMBLES.json index a20f9c537f..043753f69a 100644 --- a/inst/extdata/OSD/T/TREMBLES.json +++ b/inst/extdata/OSD/T/TREMBLES.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TREMONA.json b/inst/extdata/OSD/T/TREMONA.json index 1ecb7ad971..b25206c95e 100644 --- a/inst/extdata/OSD/T/TREMONA.json +++ b/inst/extdata/OSD/T/TREMONA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/T/TRENT.json b/inst/extdata/OSD/T/TRENT.json index 52cac622bb..c04f8a2cb4 100644 --- a/inst/extdata/OSD/T/TRENT.json +++ b/inst/extdata/OSD/T/TRENT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TRENTON.json b/inst/extdata/OSD/T/TRENTON.json index 51bb961dde..a2dee60c65 100644 --- a/inst/extdata/OSD/T/TRENTON.json +++ b/inst/extdata/OSD/T/TRENTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/T/TREON.json b/inst/extdata/OSD/T/TREON.json index 8a70ccc12f..ed384da1e2 100644 --- a/inst/extdata/OSD/T/TREON.json +++ b/inst/extdata/OSD/T/TREON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRETTEN.json b/inst/extdata/OSD/T/TRETTEN.json index c32d405c8d..60dda6226f 100644 --- a/inst/extdata/OSD/T/TRETTEN.json +++ b/inst/extdata/OSD/T/TRETTEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRIMBLE.json b/inst/extdata/OSD/T/TRIMBLE.json index 9a53a55909..0557bf784d 100644 --- a/inst/extdata/OSD/T/TRIMBLE.json +++ b/inst/extdata/OSD/T/TRIMBLE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TRIMMER.json b/inst/extdata/OSD/T/TRIMMER.json index b33050f6c9..821928b162 100644 --- a/inst/extdata/OSD/T/TRIMMER.json +++ b/inst/extdata/OSD/T/TRIMMER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/T/TRINITY.json b/inst/extdata/OSD/T/TRINITY.json index 5f68739784..6b5e492feb 100644 --- a/inst/extdata/OSD/T/TRINITY.json +++ b/inst/extdata/OSD/T/TRINITY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/T/TRIPIT.json b/inst/extdata/OSD/T/TRIPIT.json index e0c0fc2de4..205ee448b8 100644 --- a/inst/extdata/OSD/T/TRIPIT.json +++ b/inst/extdata/OSD/T/TRIPIT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRIPLEN.json b/inst/extdata/OSD/T/TRIPLEN.json index f9387ab2c3..80249344aa 100644 --- a/inst/extdata/OSD/T/TRIPLEN.json +++ b/inst/extdata/OSD/T/TRIPLEN.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TROSI.json b/inst/extdata/OSD/T/TROSI.json index a0c95c10d6..f4cbfd8b31 100644 --- a/inst/extdata/OSD/T/TROSI.json +++ b/inst/extdata/OSD/T/TROSI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TROUTVILLE.json b/inst/extdata/OSD/T/TROUTVILLE.json index 7d271b95b8..77a577cb18 100644 --- a/inst/extdata/OSD/T/TROUTVILLE.json +++ b/inst/extdata/OSD/T/TROUTVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRUCKTON.json b/inst/extdata/OSD/T/TRUCKTON.json index 94bffc8d0c..e933405fdd 100644 --- a/inst/extdata/OSD/T/TRUCKTON.json +++ b/inst/extdata/OSD/T/TRUCKTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRUEFISSURE.json b/inst/extdata/OSD/T/TRUEFISSURE.json index b5853976a6..dd98c00208 100644 --- a/inst/extdata/OSD/T/TRUEFISSURE.json +++ b/inst/extdata/OSD/T/TRUEFISSURE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRUITT.json b/inst/extdata/OSD/T/TRUITT.json index 80db01d50a..02bde84de6 100644 --- a/inst/extdata/OSD/T/TRUITT.json +++ b/inst/extdata/OSD/T/TRUITT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TRULON.json b/inst/extdata/OSD/T/TRULON.json index 6d28f0ef59..dd07b9f250 100644 --- a/inst/extdata/OSD/T/TRULON.json +++ b/inst/extdata/OSD/T/TRULON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TRYON.json b/inst/extdata/OSD/T/TRYON.json index 3cb6d3aefb..583bffb170 100644 --- a/inst/extdata/OSD/T/TRYON.json +++ b/inst/extdata/OSD/T/TRYON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/T/TSAMMANA.json b/inst/extdata/OSD/T/TSAMMANA.json index 3623fed266..4a9a4b823b 100644 --- a/inst/extdata/OSD/T/TSAMMANA.json +++ b/inst/extdata/OSD/T/TSAMMANA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TSUNAMI.json b/inst/extdata/OSD/T/TSUNAMI.json index be7333ee0b..2245a219ae 100644 --- a/inst/extdata/OSD/T/TSUNAMI.json +++ b/inst/extdata/OSD/T/TSUNAMI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TUCANNON.json b/inst/extdata/OSD/T/TUCANNON.json index 58303a0b63..c9d1cc07ed 100644 --- a/inst/extdata/OSD/T/TUCANNON.json +++ b/inst/extdata/OSD/T/TUCANNON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TUCKERTOWN.json b/inst/extdata/OSD/T/TUCKERTOWN.json index fe64d075fb..ea46d3125a 100644 --- a/inst/extdata/OSD/T/TUCKERTOWN.json +++ b/inst/extdata/OSD/T/TUCKERTOWN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TUCUPIT.json b/inst/extdata/OSD/T/TUCUPIT.json index 38a9973d41..1700c657df 100644 --- a/inst/extdata/OSD/T/TUCUPIT.json +++ b/inst/extdata/OSD/T/TUCUPIT.json @@ -65,7 +65,7 @@ [ { "drainage": "somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TULIK.json b/inst/extdata/OSD/T/TULIK.json index b868145eda..e4458942b6 100644 --- a/inst/extdata/OSD/T/TULIK.json +++ b/inst/extdata/OSD/T/TULIK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TUMAGAN.json b/inst/extdata/OSD/T/TUMAGAN.json index da779f5137..cc67f031a8 100644 --- a/inst/extdata/OSD/T/TUMAGAN.json +++ b/inst/extdata/OSD/T/TUMAGAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/T/TUNKHANNOCK.json b/inst/extdata/OSD/T/TUNKHANNOCK.json index 4664d5577f..f8ca461f04 100644 --- a/inst/extdata/OSD/T/TUNKHANNOCK.json +++ b/inst/extdata/OSD/T/TUNKHANNOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TURK.json b/inst/extdata/OSD/T/TURK.json index 856a8b5fd6..7230fe5737 100644 --- a/inst/extdata/OSD/T/TURK.json +++ b/inst/extdata/OSD/T/TURK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/T/TURKEYSPRINGS.json b/inst/extdata/OSD/T/TURKEYSPRINGS.json index 5121f7f71b..ba2f37ec93 100644 --- a/inst/extdata/OSD/T/TURKEYSPRINGS.json +++ b/inst/extdata/OSD/T/TURKEYSPRINGS.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TURNBACK.json b/inst/extdata/OSD/T/TURNBACK.json index 1901ec16f1..b829b5afe5 100644 --- a/inst/extdata/OSD/T/TURNBACK.json +++ b/inst/extdata/OSD/T/TURNBACK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/T/TURPENTINE.json b/inst/extdata/OSD/T/TURPENTINE.json index e2d29c0725..0bfbd73020 100644 --- a/inst/extdata/OSD/T/TURPENTINE.json +++ b/inst/extdata/OSD/T/TURPENTINE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TURPIN.json b/inst/extdata/OSD/T/TURPIN.json index b3d6635c08..477a727563 100644 --- a/inst/extdata/OSD/T/TURPIN.json +++ b/inst/extdata/OSD/T/TURPIN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/T/TURRET.json b/inst/extdata/OSD/T/TURRET.json index 3e5bec0dd0..4bdb424ab4 100644 --- a/inst/extdata/OSD/T/TURRET.json +++ b/inst/extdata/OSD/T/TURRET.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TURSON.json b/inst/extdata/OSD/T/TURSON.json index d11666b459..db9fa39544 100644 --- a/inst/extdata/OSD/T/TURSON.json +++ b/inst/extdata/OSD/T/TURSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/T/TURTON.json b/inst/extdata/OSD/T/TURTON.json index f91913bfe3..a83b89c658 100644 --- a/inst/extdata/OSD/T/TURTON.json +++ b/inst/extdata/OSD/T/TURTON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/T/TWOBIT.json b/inst/extdata/OSD/T/TWOBIT.json index b8ce52539f..348ff21881 100644 --- a/inst/extdata/OSD/T/TWOBIT.json +++ b/inst/extdata/OSD/T/TWOBIT.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/T/TYEE.json b/inst/extdata/OSD/T/TYEE.json index 3aa8a1f175..c0ddfa60a9 100644 --- a/inst/extdata/OSD/T/TYEE.json +++ b/inst/extdata/OSD/T/TYEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/U/UBAR.json b/inst/extdata/OSD/U/UBAR.json index e7138dfed7..d53b7dcb04 100644 --- a/inst/extdata/OSD/U/UBAR.json +++ b/inst/extdata/OSD/U/UBAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/U/UBLY.json b/inst/extdata/OSD/U/UBLY.json index b4f3883cc6..ea06547bfa 100644 --- a/inst/extdata/OSD/U/UBLY.json +++ b/inst/extdata/OSD/U/UBLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/U/UDOLPHO.json b/inst/extdata/OSD/U/UDOLPHO.json index 5898f029fe..1fa0292dad 100644 --- a/inst/extdata/OSD/U/UDOLPHO.json +++ b/inst/extdata/OSD/U/UDOLPHO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/U/UMBO.json b/inst/extdata/OSD/U/UMBO.json index 8b0a930b9c..6a5a65ef1f 100644 --- a/inst/extdata/OSD/U/UMBO.json +++ b/inst/extdata/OSD/U/UMBO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", - "drainage_overview": "somewhat poorly and moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/U/UMNAK.json b/inst/extdata/OSD/U/UMNAK.json index 4455affb0f..6e341d6dc6 100644 --- a/inst/extdata/OSD/U/UMNAK.json +++ b/inst/extdata/OSD/U/UMNAK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/U/UMPA.json b/inst/extdata/OSD/U/UMPA.json index 2b83575138..b35c3d799e 100644 --- a/inst/extdata/OSD/U/UMPA.json +++ b/inst/extdata/OSD/U/UMPA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/U/UNCOMPAHGRE.json b/inst/extdata/OSD/U/UNCOMPAHGRE.json index 7a2d8ae01d..35e2c39104 100644 --- a/inst/extdata/OSD/U/UNCOMPAHGRE.json +++ b/inst/extdata/OSD/U/UNCOMPAHGRE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/U/UNITYLAKE.json b/inst/extdata/OSD/U/UNITYLAKE.json index b9cc95a25a..353e057688 100644 --- a/inst/extdata/OSD/U/UNITYLAKE.json +++ b/inst/extdata/OSD/U/UNITYLAKE.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/U/URANDA.json b/inst/extdata/OSD/U/URANDA.json index d65fd292bf..2f9761e577 100644 --- a/inst/extdata/OSD/U/URANDA.json +++ b/inst/extdata/OSD/U/URANDA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/U/URBANA.json b/inst/extdata/OSD/U/URBANA.json index 0707f8bda2..4c4d35b238 100644 --- a/inst/extdata/OSD/U/URBANA.json +++ b/inst/extdata/OSD/U/URBANA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "well, moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/U/UTABA.json b/inst/extdata/OSD/U/UTABA.json index f13be0da09..5f18e89978 100644 --- a/inst/extdata/OSD/U/UTABA.json +++ b/inst/extdata/OSD/U/UTABA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/U/UVADA.json b/inst/extdata/OSD/U/UVADA.json index d8164e5539..3d712ac1b8 100644 --- a/inst/extdata/OSD/U/UVADA.json +++ b/inst/extdata/OSD/U/UVADA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VADER.json b/inst/extdata/OSD/V/VADER.json index 1d1141f33a..bda5bc11f5 100644 --- a/inst/extdata/OSD/V/VADER.json +++ b/inst/extdata/OSD/V/VADER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VALERIAN.json b/inst/extdata/OSD/V/VALERIAN.json index 86e07f8cac..81f4a7d5c5 100644 --- a/inst/extdata/OSD/V/VALERIAN.json +++ b/inst/extdata/OSD/V/VALERIAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "excessively", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/V/VALKARIA.json b/inst/extdata/OSD/V/VALKARIA.json index b57ad0e779..64352af747 100644 --- a/inst/extdata/OSD/V/VALKARIA.json +++ b/inst/extdata/OSD/V/VALKARIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/V/VALLEONO.json b/inst/extdata/OSD/V/VALLEONO.json index 9499a664e5..ed6cc27ad7 100644 --- a/inst/extdata/OSD/V/VALLEONO.json +++ b/inst/extdata/OSD/V/VALLEONO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VAMONT.json b/inst/extdata/OSD/V/VAMONT.json index ebbacf644f..7abc46394b 100644 --- a/inst/extdata/OSD/V/VAMONT.json +++ b/inst/extdata/OSD/V/VAMONT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/V/VANAJO.json b/inst/extdata/OSD/V/VANAJO.json index 7e3667ccb5..472901df58 100644 --- a/inst/extdata/OSD/V/VANAJO.json +++ b/inst/extdata/OSD/V/VANAJO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/V/VANDERGRIFT.json b/inst/extdata/OSD/V/VANDERGRIFT.json index d161f15777..0012c4d95a 100644 --- a/inst/extdata/OSD/V/VANDERGRIFT.json +++ b/inst/extdata/OSD/V/VANDERGRIFT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and somewhat poorly", - "drainage_overview": "moderately well and somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/V/VANG.json b/inst/extdata/OSD/V/VANG.json index 23dc3853ac..4d893411cd 100644 --- a/inst/extdata/OSD/V/VANG.json +++ b/inst/extdata/OSD/V/VANG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VAN_HORN.json b/inst/extdata/OSD/V/VAN_HORN.json index fc211ae226..2faf3d91a7 100644 --- a/inst/extdata/OSD/V/VAN_HORN.json +++ b/inst/extdata/OSD/V/VAN_HORN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/V/VARYSBURG.json b/inst/extdata/OSD/V/VARYSBURG.json index 3d8d32f886..a7f14ade73 100644 --- a/inst/extdata/OSD/V/VARYSBURG.json +++ b/inst/extdata/OSD/V/VARYSBURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VASSAR.json b/inst/extdata/OSD/V/VASSAR.json index d5f91e3d1b..e42068efbf 100644 --- a/inst/extdata/OSD/V/VASSAR.json +++ b/inst/extdata/OSD/V/VASSAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/V/VASTINE.json b/inst/extdata/OSD/V/VASTINE.json index 50b64eb7c0..9766afeab0 100644 --- a/inst/extdata/OSD/V/VASTINE.json +++ b/inst/extdata/OSD/V/VASTINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", - "drainage_overview": "poorly to somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/V/VEGA.json b/inst/extdata/OSD/V/VEGA.json index 72fe1acb1f..8366d73e70 100644 --- a/inst/extdata/OSD/V/VEGA.json +++ b/inst/extdata/OSD/V/VEGA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VELMA.json b/inst/extdata/OSD/V/VELMA.json index 9496810d61..dc27f0fc96 100644 --- a/inst/extdata/OSD/V/VELMA.json +++ b/inst/extdata/OSD/V/VELMA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VELVET.json b/inst/extdata/OSD/V/VELVET.json index 32a9b1bfda..87e2fc4791 100644 --- a/inst/extdata/OSD/V/VELVET.json +++ b/inst/extdata/OSD/V/VELVET.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VENA.json b/inst/extdata/OSD/V/VENA.json index 0b918ac411..e524e3d9c2 100644 --- a/inst/extdata/OSD/V/VENA.json +++ b/inst/extdata/OSD/V/VENA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VENATOR.json b/inst/extdata/OSD/V/VENATOR.json index 6dd3f04ab1..82d888cbb9 100644 --- a/inst/extdata/OSD/V/VENATOR.json +++ b/inst/extdata/OSD/V/VENATOR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VENEZIA.json b/inst/extdata/OSD/V/VENEZIA.json index 0921784110..54d8a1288c 100644 --- a/inst/extdata/OSD/V/VENEZIA.json +++ b/inst/extdata/OSD/V/VENEZIA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VERDE.json b/inst/extdata/OSD/V/VERDE.json index b6da720381..68033626b5 100644 --- a/inst/extdata/OSD/V/VERDE.json +++ b/inst/extdata/OSD/V/VERDE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/V/VERLAND.json b/inst/extdata/OSD/V/VERLAND.json index dd84c764ad..83fdaebdd4 100644 --- a/inst/extdata/OSD/V/VERLAND.json +++ b/inst/extdata/OSD/V/VERLAND.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/V/VERO.json b/inst/extdata/OSD/V/VERO.json index 09f80c7660..4fd6ff0c5c 100644 --- a/inst/extdata/OSD/V/VERO.json +++ b/inst/extdata/OSD/V/VERO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/V/VERTINE.json b/inst/extdata/OSD/V/VERTINE.json index a27f033f73..99028e5c26 100644 --- a/inst/extdata/OSD/V/VERTINE.json +++ b/inst/extdata/OSD/V/VERTINE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/V/VESTABURG.json b/inst/extdata/OSD/V/VESTABURG.json index c4d2ccd19e..4cadd86186 100644 --- a/inst/extdata/OSD/V/VESTABURG.json +++ b/inst/extdata/OSD/V/VESTABURG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/V/VESTON.json b/inst/extdata/OSD/V/VESTON.json index c87347bedb..c19c20780f 100644 --- a/inst/extdata/OSD/V/VESTON.json +++ b/inst/extdata/OSD/V/VESTON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/V/VEYO.json b/inst/extdata/OSD/V/VEYO.json index d49be9e2dd..b9137024de 100644 --- a/inst/extdata/OSD/V/VEYO.json +++ b/inst/extdata/OSD/V/VEYO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VICI.json b/inst/extdata/OSD/V/VICI.json index 1f1bd05892..c1130567ff 100644 --- a/inst/extdata/OSD/V/VICI.json +++ b/inst/extdata/OSD/V/VICI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat excessively", "drainage_overview": "excessively" } ] diff --git a/inst/extdata/OSD/V/VICU.json b/inst/extdata/OSD/V/VICU.json index 79e19c0138..75260c3f78 100644 --- a/inst/extdata/OSD/V/VICU.json +++ b/inst/extdata/OSD/V/VICU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/V/VIDAURI.json b/inst/extdata/OSD/V/VIDAURI.json index 6a210f1352..e1ab4955a6 100644 --- a/inst/extdata/OSD/V/VIDAURI.json +++ b/inst/extdata/OSD/V/VIDAURI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/V/VIDRINE.json b/inst/extdata/OSD/V/VIDRINE.json index ca76986cf1..08c9c50c40 100644 --- a/inst/extdata/OSD/V/VIDRINE.json +++ b/inst/extdata/OSD/V/VIDRINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/V/VINCENT.json b/inst/extdata/OSD/V/VINCENT.json index 59dd6d7517..417610a146 100644 --- a/inst/extdata/OSD/V/VINCENT.json +++ b/inst/extdata/OSD/V/VINCENT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/V/VININI.json b/inst/extdata/OSD/V/VININI.json index e94bea7cf0..e48f72bacb 100644 --- a/inst/extdata/OSD/V/VININI.json +++ b/inst/extdata/OSD/V/VININI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VINJE.json b/inst/extdata/OSD/V/VINJE.json index f783b3ae84..fbc30a65ec 100644 --- a/inst/extdata/OSD/V/VINJE.json +++ b/inst/extdata/OSD/V/VINJE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VIXEN.json b/inst/extdata/OSD/V/VIXEN.json index 3d083e12c7..16044dff8c 100644 --- a/inst/extdata/OSD/V/VIXEN.json +++ b/inst/extdata/OSD/V/VIXEN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VIZCAYA.json b/inst/extdata/OSD/V/VIZCAYA.json index 729eab1fbb..76723d0052 100644 --- a/inst/extdata/OSD/V/VIZCAYA.json +++ b/inst/extdata/OSD/V/VIZCAYA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", + "drainage": "poorly, very poorly", "drainage_overview": "very poorly" } ] diff --git a/inst/extdata/OSD/V/VLY.json b/inst/extdata/OSD/V/VLY.json index f83610af08..ec729912e7 100644 --- a/inst/extdata/OSD/V/VLY.json +++ b/inst/extdata/OSD/V/VLY.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well" + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/V/VOGEL.json b/inst/extdata/OSD/V/VOGEL.json index 7c753d6a90..f8b42aacf9 100644 --- a/inst/extdata/OSD/V/VOGEL.json +++ b/inst/extdata/OSD/V/VOGEL.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/V/VOLKMAR.json b/inst/extdata/OSD/V/VOLKMAR.json index 54cefacab5..9d09b09068 100644 --- a/inst/extdata/OSD/V/VOLKMAR.json +++ b/inst/extdata/OSD/V/VOLKMAR.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "" + "drainage_overview": "moderately well" } ] ], diff --git a/inst/extdata/OSD/V/VOLTAIRE.json b/inst/extdata/OSD/V/VOLTAIRE.json index 97d4a00181..720c6d6234 100644 --- a/inst/extdata/OSD/V/VOLTAIRE.json +++ b/inst/extdata/OSD/V/VOLTAIRE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/V/VONA.json b/inst/extdata/OSD/V/VONA.json index 10b20a0170..12365809b7 100644 --- a/inst/extdata/OSD/V/VONA.json +++ b/inst/extdata/OSD/V/VONA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/V/VONALEE.json b/inst/extdata/OSD/V/VONALEE.json index d140a34224..76e7d7c556 100644 --- a/inst/extdata/OSD/V/VONALEE.json +++ b/inst/extdata/OSD/V/VONALEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/V/VORHEES.json b/inst/extdata/OSD/V/VORHEES.json index 3b53bb107a..e5a7180895 100644 --- a/inst/extdata/OSD/V/VORHEES.json +++ b/inst/extdata/OSD/V/VORHEES.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WABANICA.json b/inst/extdata/OSD/W/WABANICA.json index 152926d347..805ab909ec 100644 --- a/inst/extdata/OSD/W/WABANICA.json +++ b/inst/extdata/OSD/W/WABANICA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WABASH.json b/inst/extdata/OSD/W/WABASH.json index f5b073d37e..89750f3f44 100644 --- a/inst/extdata/OSD/W/WABASH.json +++ b/inst/extdata/OSD/W/WABASH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WABASHA.json b/inst/extdata/OSD/W/WABASHA.json index 18e580192e..3d45684ca0 100644 --- a/inst/extdata/OSD/W/WABASHA.json +++ b/inst/extdata/OSD/W/WABASHA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WABASSO.json b/inst/extdata/OSD/W/WABASSO.json index 8f8a742463..a3d0024eff 100644 --- a/inst/extdata/OSD/W/WABASSO.json +++ b/inst/extdata/OSD/W/WABASSO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WABUN.json b/inst/extdata/OSD/W/WABUN.json index 7a931c80f3..7d35152fcf 100644 --- a/inst/extdata/OSD/W/WABUN.json +++ b/inst/extdata/OSD/W/WABUN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WACA.json b/inst/extdata/OSD/W/WACA.json index 5945914848..8bee1c6192 100644 --- a/inst/extdata/OSD/W/WACA.json +++ b/inst/extdata/OSD/W/WACA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WADLEY.json b/inst/extdata/OSD/W/WADLEY.json index 0aa0c948e6..45a876d320 100644 --- a/inst/extdata/OSD/W/WADLEY.json +++ b/inst/extdata/OSD/W/WADLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/W/WAHEE.json b/inst/extdata/OSD/W/WAHEE.json index b4e967ac55..635c5fce78 100644 --- a/inst/extdata/OSD/W/WAHEE.json +++ b/inst/extdata/OSD/W/WAHEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/W/WAHTIGUP.json b/inst/extdata/OSD/W/WAHTIGUP.json index 1900e75b4d..71b62819d7 100644 --- a/inst/extdata/OSD/W/WAHTIGUP.json +++ b/inst/extdata/OSD/W/WAHTIGUP.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WAKELEY.json b/inst/extdata/OSD/W/WAKELEY.json index fe97d12bdd..02f2a134b4 100644 --- a/inst/extdata/OSD/W/WAKELEY.json +++ b/inst/extdata/OSD/W/WAKELEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WALDEN.json b/inst/extdata/OSD/W/WALDEN.json index 50031f92e1..65c004c03c 100644 --- a/inst/extdata/OSD/W/WALDEN.json +++ b/inst/extdata/OSD/W/WALDEN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WALFORD.json b/inst/extdata/OSD/W/WALFORD.json index 28aee48c78..8c3dfd6f24 100644 --- a/inst/extdata/OSD/W/WALFORD.json +++ b/inst/extdata/OSD/W/WALFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WALKE.json b/inst/extdata/OSD/W/WALKE.json index 9b95afb1df..f1becfb8d0 100644 --- a/inst/extdata/OSD/W/WALKE.json +++ b/inst/extdata/OSD/W/WALKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WALLER.json b/inst/extdata/OSD/W/WALLER.json index 9dc68c6b8a..9cfb7187fd 100644 --- a/inst/extdata/OSD/W/WALLER.json +++ b/inst/extdata/OSD/W/WALLER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/W/WALLULA.json b/inst/extdata/OSD/W/WALLULA.json index e2007fcccd..c1a45eb469 100644 --- a/inst/extdata/OSD/W/WALLULA.json +++ b/inst/extdata/OSD/W/WALLULA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/W/WALSH.json b/inst/extdata/OSD/W/WALSH.json index 317d60c525..70054f3b9b 100644 --- a/inst/extdata/OSD/W/WALSH.json +++ b/inst/extdata/OSD/W/WALSH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WALVAN.json b/inst/extdata/OSD/W/WALVAN.json index 1d3e600cb8..83650a6607 100644 --- a/inst/extdata/OSD/W/WALVAN.json +++ b/inst/extdata/OSD/W/WALVAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WAMIC.json b/inst/extdata/OSD/W/WAMIC.json index 06c2f8311e..f6b7919e75 100644 --- a/inst/extdata/OSD/W/WAMIC.json +++ b/inst/extdata/OSD/W/WAMIC.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WANBLEE.json b/inst/extdata/OSD/W/WANBLEE.json index 3d54272234..19837fb3ca 100644 --- a/inst/extdata/OSD/W/WANBLEE.json +++ b/inst/extdata/OSD/W/WANBLEE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well or moderately well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WANETTA.json b/inst/extdata/OSD/W/WANETTA.json index 58fbc6c194..c27f8f5b35 100644 --- a/inst/extdata/OSD/W/WANETTA.json +++ b/inst/extdata/OSD/W/WANETTA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WANILLA.json b/inst/extdata/OSD/W/WANILLA.json index 4fa8d9b01d..8180b08abb 100644 --- a/inst/extdata/OSD/W/WANILLA.json +++ b/inst/extdata/OSD/W/WANILLA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAPINITIA.json b/inst/extdata/OSD/W/WAPINITIA.json index c2b7e317dd..7e7806657c 100644 --- a/inst/extdata/OSD/W/WAPINITIA.json +++ b/inst/extdata/OSD/W/WAPINITIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WAPSHILLA.json b/inst/extdata/OSD/W/WAPSHILLA.json index b7f54a44a5..ea21c2bd19 100644 --- a/inst/extdata/OSD/W/WAPSHILLA.json +++ b/inst/extdata/OSD/W/WAPSHILLA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WARBA.json b/inst/extdata/OSD/W/WARBA.json index 54072f5044..0283f9dcf3 100644 --- a/inst/extdata/OSD/W/WARBA.json +++ b/inst/extdata/OSD/W/WARBA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well and well", - "drainage_overview": "moderately well and well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WARE.json b/inst/extdata/OSD/W/WARE.json index 6e3bc54020..ea3c64c0eb 100644 --- a/inst/extdata/OSD/W/WARE.json +++ b/inst/extdata/OSD/W/WARE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WAREHAM.json b/inst/extdata/OSD/W/WAREHAM.json index a86cf9da53..3b7acadc61 100644 --- a/inst/extdata/OSD/W/WAREHAM.json +++ b/inst/extdata/OSD/W/WAREHAM.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and somewhat poorly", - "drainage_overview": "poorly and somewhat poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/W/WARFIELD.json b/inst/extdata/OSD/W/WARFIELD.json index ea0b753e4b..f455654caf 100644 --- a/inst/extdata/OSD/W/WARFIELD.json +++ b/inst/extdata/OSD/W/WARFIELD.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WARMAN.json b/inst/extdata/OSD/W/WARMAN.json index 5b1b0ac6ff..1d730648b9 100644 --- a/inst/extdata/OSD/W/WARMAN.json +++ b/inst/extdata/OSD/W/WARMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WARNE.json b/inst/extdata/OSD/W/WARNE.json index 37ab49e0e3..4243ce128b 100644 --- a/inst/extdata/OSD/W/WARNE.json +++ b/inst/extdata/OSD/W/WARNE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "somewhat poorly", "drainage_overview": "somewhat poorly" } ] diff --git a/inst/extdata/OSD/W/WATERDOG.json b/inst/extdata/OSD/W/WATERDOG.json index aabc6ab1bb..3c4fbd8b9e 100644 --- a/inst/extdata/OSD/W/WATERDOG.json +++ b/inst/extdata/OSD/W/WATERDOG.json @@ -65,7 +65,7 @@ [ { "drainage": "very poorly", - "drainage_overview": "very poorly to poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WATERFALL.json b/inst/extdata/OSD/W/WATERFALL.json index 0d32b4fece..d7a5981f50 100644 --- a/inst/extdata/OSD/W/WATERFALL.json +++ b/inst/extdata/OSD/W/WATERFALL.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well or moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WATO.json b/inst/extdata/OSD/W/WATO.json index 74b75586a7..58935b1ef3 100644 --- a/inst/extdata/OSD/W/WATO.json +++ b/inst/extdata/OSD/W/WATO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WAUCEDAH.json b/inst/extdata/OSD/W/WAUCEDAH.json index ca2c75114a..51760bb030 100644 --- a/inst/extdata/OSD/W/WAUCEDAH.json +++ b/inst/extdata/OSD/W/WAUCEDAH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAUCHULA.json b/inst/extdata/OSD/W/WAUCHULA.json index 1b6d8e316b..e887b71133 100644 --- a/inst/extdata/OSD/W/WAUCHULA.json +++ b/inst/extdata/OSD/W/WAUCHULA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly or very poorly", - "drainage_overview": "very poorly or poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAUKENA.json b/inst/extdata/OSD/W/WAUKENA.json index 505409271f..e4ab0f2e83 100644 --- a/inst/extdata/OSD/W/WAUKENA.json +++ b/inst/extdata/OSD/W/WAUKENA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to somewhat poorly", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WAUSEON.json b/inst/extdata/OSD/W/WAUSEON.json index aab4131e98..7831e02d31 100644 --- a/inst/extdata/OSD/W/WAUSEON.json +++ b/inst/extdata/OSD/W/WAUSEON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAUTOMA.json b/inst/extdata/OSD/W/WAUTOMA.json index 9350832c1c..261e9feb8d 100644 --- a/inst/extdata/OSD/W/WAUTOMA.json +++ b/inst/extdata/OSD/W/WAUTOMA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAVELAND.json b/inst/extdata/OSD/W/WAVELAND.json index 4199663f26..1e69c8310c 100644 --- a/inst/extdata/OSD/W/WAVELAND.json +++ b/inst/extdata/OSD/W/WAVELAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly and poorly", - "drainage_overview": "very poorly and poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WAYLAND.json b/inst/extdata/OSD/W/WAYLAND.json index a684df757c..26f3ef79e2 100644 --- a/inst/extdata/OSD/W/WAYLAND.json +++ b/inst/extdata/OSD/W/WAYLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WEATHERFORD.json b/inst/extdata/OSD/W/WEATHERFORD.json index afd426e5f1..137ed04562 100644 --- a/inst/extdata/OSD/W/WEATHERFORD.json +++ b/inst/extdata/OSD/W/WEATHERFORD.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WEBBGULCH.json b/inst/extdata/OSD/W/WEBBGULCH.json index 06c942029d..9be1f97bf3 100644 --- a/inst/extdata/OSD/W/WEBBGULCH.json +++ b/inst/extdata/OSD/W/WEBBGULCH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WEBBRIDGE.json b/inst/extdata/OSD/W/WEBBRIDGE.json index ea5125ce3c..160d514ce0 100644 --- a/inst/extdata/OSD/W/WEBBRIDGE.json +++ b/inst/extdata/OSD/W/WEBBRIDGE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WEEDING.json b/inst/extdata/OSD/W/WEEDING.json index 96ecbb3a57..d16f0ac3ba 100644 --- a/inst/extdata/OSD/W/WEEDING.json +++ b/inst/extdata/OSD/W/WEEDING.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "somewhat poorly and moderately well", + "drainage": "moderately well, somewhat poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WEHADKEE.json b/inst/extdata/OSD/W/WEHADKEE.json index 70aa702be5..66a4a913ee 100644 --- a/inst/extdata/OSD/W/WEHADKEE.json +++ b/inst/extdata/OSD/W/WEHADKEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WEKIVA.json b/inst/extdata/OSD/W/WEKIVA.json index 43c8a05258..12e4448f7f 100644 --- a/inst/extdata/OSD/W/WEKIVA.json +++ b/inst/extdata/OSD/W/WEKIVA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WELBY.json b/inst/extdata/OSD/W/WELBY.json index b31cb86513..831eed92ae 100644 --- a/inst/extdata/OSD/W/WELBY.json +++ b/inst/extdata/OSD/W/WELBY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WELCH.json b/inst/extdata/OSD/W/WELCH.json index 8cdcc9449f..ec7715c44b 100644 --- a/inst/extdata/OSD/W/WELCH.json +++ b/inst/extdata/OSD/W/WELCH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WELLSBORO.json b/inst/extdata/OSD/W/WELLSBORO.json index 99c7534b6c..00876e2dc4 100644 --- a/inst/extdata/OSD/W/WELLSBORO.json +++ b/inst/extdata/OSD/W/WELLSBORO.json @@ -65,7 +65,7 @@ [ { "drainage": "moderately well", - "drainage_overview": "moderately well and somewhat poorly" + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/W/WENAS.json b/inst/extdata/OSD/W/WENAS.json index 4600766486..9ebb809663 100644 --- a/inst/extdata/OSD/W/WENAS.json +++ b/inst/extdata/OSD/W/WENAS.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly or poorly", - "drainage_overview": "somewhat poorly and poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/W/WENDOVER.json b/inst/extdata/OSD/W/WENDOVER.json index 4408933d49..2423c29d92 100644 --- a/inst/extdata/OSD/W/WENDOVER.json +++ b/inst/extdata/OSD/W/WENDOVER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WENTWORTH.json b/inst/extdata/OSD/W/WENTWORTH.json index cce170d067..9868814044 100644 --- a/inst/extdata/OSD/W/WENTWORTH.json +++ b/inst/extdata/OSD/W/WENTWORTH.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WEQUETEQUOCK.json b/inst/extdata/OSD/W/WEQUETEQUOCK.json index d53995a54b..9f2a0f6dc3 100644 --- a/inst/extdata/OSD/W/WEQUETEQUOCK.json +++ b/inst/extdata/OSD/W/WEQUETEQUOCK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/W/WESO.json b/inst/extdata/OSD/W/WESO.json index eb93c20775..1ba481d904 100644 --- a/inst/extdata/OSD/W/WESO.json +++ b/inst/extdata/OSD/W/WESO.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WESSEL.json b/inst/extdata/OSD/W/WESSEL.json index 12b0414fb4..e41e8c10a2 100644 --- a/inst/extdata/OSD/W/WESSEL.json +++ b/inst/extdata/OSD/W/WESSEL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WESSER.json b/inst/extdata/OSD/W/WESSER.json index fb7cf63e64..7e7b26da24 100644 --- a/inst/extdata/OSD/W/WESSER.json +++ b/inst/extdata/OSD/W/WESSER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WESTBAY.json b/inst/extdata/OSD/W/WESTBAY.json index 57032ee4fc..4aea9af2a6 100644 --- a/inst/extdata/OSD/W/WESTBAY.json +++ b/inst/extdata/OSD/W/WESTBAY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/W/WESTLAND.json b/inst/extdata/OSD/W/WESTLAND.json index 3843912b52..bc00422de4 100644 --- a/inst/extdata/OSD/W/WESTLAND.json +++ b/inst/extdata/OSD/W/WESTLAND.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WESTPLAIN.json b/inst/extdata/OSD/W/WESTPLAIN.json index 4ac8df9778..e91aae0f75 100644 --- a/inst/extdata/OSD/W/WESTPLAIN.json +++ b/inst/extdata/OSD/W/WESTPLAIN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly to somewhat poorly", + "drainage": "somewhat poorly, poorly", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WESTSHORE.json b/inst/extdata/OSD/W/WESTSHORE.json index a26323615e..b11ef473f5 100644 --- a/inst/extdata/OSD/W/WESTSHORE.json +++ b/inst/extdata/OSD/W/WESTSHORE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WESTVILLE.json b/inst/extdata/OSD/W/WESTVILLE.json index 65aa89dfde..e11ace5096 100644 --- a/inst/extdata/OSD/W/WESTVILLE.json +++ b/inst/extdata/OSD/W/WESTVILLE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WETBAG.json b/inst/extdata/OSD/W/WETBAG.json index d1cd307e6e..7ff0bfa60e 100644 --- a/inst/extdata/OSD/W/WETBAG.json +++ b/inst/extdata/OSD/W/WETBAG.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WHEATLEY.json b/inst/extdata/OSD/W/WHEATLEY.json index a41cebaa92..f00fb1674a 100644 --- a/inst/extdata/OSD/W/WHEATLEY.json +++ b/inst/extdata/OSD/W/WHEATLEY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WHETSTONE.json b/inst/extdata/OSD/W/WHETSTONE.json index adcab57845..3082cbbc6d 100644 --- a/inst/extdata/OSD/W/WHETSTONE.json +++ b/inst/extdata/OSD/W/WHETSTONE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WHITEPOST.json b/inst/extdata/OSD/W/WHITEPOST.json index 9add663580..d2e9e74319 100644 --- a/inst/extdata/OSD/W/WHITEPOST.json +++ b/inst/extdata/OSD/W/WHITEPOST.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WHITESON.json b/inst/extdata/OSD/W/WHITESON.json index 9effcbc90f..706c2bbf0d 100644 --- a/inst/extdata/OSD/W/WHITESON.json +++ b/inst/extdata/OSD/W/WHITESON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to poorly", - "drainage_overview": "somewhat poorly to poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/W/WHITEWOOD.json b/inst/extdata/OSD/W/WHITEWOOD.json index b7629e906d..2fb8995d42 100644 --- a/inst/extdata/OSD/W/WHITEWOOD.json +++ b/inst/extdata/OSD/W/WHITEWOOD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "poorly" + "drainage": "somewhat poorly, poorly", + "drainage_overview": "somewhat poorly, poorly" } ] ], diff --git a/inst/extdata/OSD/W/WHITEWRIGHT.json b/inst/extdata/OSD/W/WHITEWRIGHT.json index 7720cb875b..cb7a42b585 100644 --- a/inst/extdata/OSD/W/WHITEWRIGHT.json +++ b/inst/extdata/OSD/W/WHITEWRIGHT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WIBAUX.json b/inst/extdata/OSD/W/WIBAUX.json index 3f27ae0c80..a6d44e9fcd 100644 --- a/inst/extdata/OSD/W/WIBAUX.json +++ b/inst/extdata/OSD/W/WIBAUX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", + "drainage": "somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WICHITA.json b/inst/extdata/OSD/W/WICHITA.json index 78060c4809..e4b67d0fef 100644 --- a/inst/extdata/OSD/W/WICHITA.json +++ b/inst/extdata/OSD/W/WICHITA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WICKFORD.json b/inst/extdata/OSD/W/WICKFORD.json index e3066d47cd..79d931fcbd 100644 --- a/inst/extdata/OSD/W/WICKFORD.json +++ b/inst/extdata/OSD/W/WICKFORD.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "subaqueous", + "drainage_overview": "subaqueous" } ] ], diff --git a/inst/extdata/OSD/W/WILDMAD.json b/inst/extdata/OSD/W/WILDMAD.json index 080bca5524..72b0dee51e 100644 --- a/inst/extdata/OSD/W/WILDMAD.json +++ b/inst/extdata/OSD/W/WILDMAD.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WILHITE.json b/inst/extdata/OSD/W/WILHITE.json index 3855ab4ab2..791ef41f5c 100644 --- a/inst/extdata/OSD/W/WILHITE.json +++ b/inst/extdata/OSD/W/WILHITE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WILLIS.json b/inst/extdata/OSD/W/WILLIS.json index d68881723f..7c897d6c71 100644 --- a/inst/extdata/OSD/W/WILLIS.json +++ b/inst/extdata/OSD/W/WILLIS.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WILLOWS.json b/inst/extdata/OSD/W/WILLOWS.json index 36f1f8f2a7..b93ed743ba 100644 --- a/inst/extdata/OSD/W/WILLOWS.json +++ b/inst/extdata/OSD/W/WILLOWS.json @@ -65,7 +65,7 @@ [ { "drainage": "poorly", - "drainage_overview": "poorly to very poorly" + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WILLOW_CREEK.json b/inst/extdata/OSD/W/WILLOW_CREEK.json index e5fca2f868..35300bdb65 100644 --- a/inst/extdata/OSD/W/WILLOW_CREEK.json +++ b/inst/extdata/OSD/W/WILLOW_CREEK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WILSON.json b/inst/extdata/OSD/W/WILSON.json index 9f97576b63..0c1f1e9053 100644 --- a/inst/extdata/OSD/W/WILSON.json +++ b/inst/extdata/OSD/W/WILSON.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/W/WILSONGULCH.json b/inst/extdata/OSD/W/WILSONGULCH.json index 5fa7259f43..ae1d5f0be6 100644 --- a/inst/extdata/OSD/W/WILSONGULCH.json +++ b/inst/extdata/OSD/W/WILSONGULCH.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WINDMILL.json b/inst/extdata/OSD/W/WINDMILL.json index 6b2a288dc0..edb61a088b 100644 --- a/inst/extdata/OSD/W/WINDMILL.json +++ b/inst/extdata/OSD/W/WINDMILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WINDOWPEAK.json b/inst/extdata/OSD/W/WINDOWPEAK.json index 812265f3ce..e07a39f357 100644 --- a/inst/extdata/OSD/W/WINDOWPEAK.json +++ b/inst/extdata/OSD/W/WINDOWPEAK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or somewhat excessively", - "drainage_overview": "well or somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/W/WINDTHORST.json b/inst/extdata/OSD/W/WINDTHORST.json index 666e9f3982..2724dd145d 100644 --- a/inst/extdata/OSD/W/WINDTHORST.json +++ b/inst/extdata/OSD/W/WINDTHORST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "moderately well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/W/WIND_RIVER.json b/inst/extdata/OSD/W/WIND_RIVER.json index c504f7568a..8544e915d9 100644 --- a/inst/extdata/OSD/W/WIND_RIVER.json +++ b/inst/extdata/OSD/W/WIND_RIVER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WINEG.json b/inst/extdata/OSD/W/WINEG.json index ae1b44ad4e..d338908e42 100644 --- a/inst/extdata/OSD/W/WINEG.json +++ b/inst/extdata/OSD/W/WINEG.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WINKLEMAN.json b/inst/extdata/OSD/W/WINKLEMAN.json index 71f6f19884..640d79806b 100644 --- a/inst/extdata/OSD/W/WINKLEMAN.json +++ b/inst/extdata/OSD/W/WINKLEMAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well and moderately well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WINNEBAGO.json b/inst/extdata/OSD/W/WINNEBAGO.json index 5533f99ec6..50a67ca6c9 100644 --- a/inst/extdata/OSD/W/WINNEBAGO.json +++ b/inst/extdata/OSD/W/WINNEBAGO.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "well and moderately well" + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WINNEMUCCA.json b/inst/extdata/OSD/W/WINNEMUCCA.json index cb4aef7d59..1f80e2122a 100644 --- a/inst/extdata/OSD/W/WINNEMUCCA.json +++ b/inst/extdata/OSD/W/WINNEMUCCA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WISE.json b/inst/extdata/OSD/W/WISE.json index 31e509e0bd..69e4ae01f7 100644 --- a/inst/extdata/OSD/W/WISE.json +++ b/inst/extdata/OSD/W/WISE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WISHEYLU.json b/inst/extdata/OSD/W/WISHEYLU.json index f2909121a7..ca128aa587 100644 --- a/inst/extdata/OSD/W/WISHEYLU.json +++ b/inst/extdata/OSD/W/WISHEYLU.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WITBECK.json b/inst/extdata/OSD/W/WITBECK.json index 9df9bd2536..e990c8f7ed 100644 --- a/inst/extdata/OSD/W/WITBECK.json +++ b/inst/extdata/OSD/W/WITBECK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/W/WOLF_POINT.json b/inst/extdata/OSD/W/WOLF_POINT.json index 5424414a05..697c8ae51c 100644 --- a/inst/extdata/OSD/W/WOLF_POINT.json +++ b/inst/extdata/OSD/W/WOLF_POINT.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WOLOT.json b/inst/extdata/OSD/W/WOLOT.json index 1d79313a18..17d306d119 100644 --- a/inst/extdata/OSD/W/WOLOT.json +++ b/inst/extdata/OSD/W/WOLOT.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WOLVERINE.json b/inst/extdata/OSD/W/WOLVERINE.json index 6000de753b..542e7a2ee3 100644 --- a/inst/extdata/OSD/W/WOLVERINE.json +++ b/inst/extdata/OSD/W/WOLVERINE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "excessively or somewhat excessively", - "drainage_overview": "excessively or somewhat excessively" + "drainage": "excessively, somewhat excessively", + "drainage_overview": "excessively, somewhat excessively" } ] ], diff --git a/inst/extdata/OSD/W/WONDER.json b/inst/extdata/OSD/W/WONDER.json index 4fc09b6736..3ef3e1a07e 100644 --- a/inst/extdata/OSD/W/WONDER.json +++ b/inst/extdata/OSD/W/WONDER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WOODHURST.json b/inst/extdata/OSD/W/WOODHURST.json index 5cb2619ee7..b95327e2df 100644 --- a/inst/extdata/OSD/W/WOODHURST.json +++ b/inst/extdata/OSD/W/WOODHURST.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WOODLY.json b/inst/extdata/OSD/W/WOODLY.json index 7f0dac9fef..b0bc79164b 100644 --- a/inst/extdata/OSD/W/WOODLY.json +++ b/inst/extdata/OSD/W/WOODLY.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WOODROCK.json b/inst/extdata/OSD/W/WOODROCK.json index 1badaa471d..42deadb692 100644 --- a/inst/extdata/OSD/W/WOODROCK.json +++ b/inst/extdata/OSD/W/WOODROCK.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WOODROW.json b/inst/extdata/OSD/W/WOODROW.json index ca90810efe..4b30cc1fe4 100644 --- a/inst/extdata/OSD/W/WOODROW.json +++ b/inst/extdata/OSD/W/WOODROW.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WOODSLAKE.json b/inst/extdata/OSD/W/WOODSLAKE.json index 63d44d29f1..8aa57d6cbd 100644 --- a/inst/extdata/OSD/W/WOODSLAKE.json +++ b/inst/extdata/OSD/W/WOODSLAKE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WOOLPER.json b/inst/extdata/OSD/W/WOOLPER.json index 25abb143c3..a17a91c6d6 100644 --- a/inst/extdata/OSD/W/WOOLPER.json +++ b/inst/extdata/OSD/W/WOOLPER.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WORTHING.json b/inst/extdata/OSD/W/WORTHING.json index 3dbc5e8573..88d8f65b8d 100644 --- a/inst/extdata/OSD/W/WORTHING.json +++ b/inst/extdata/OSD/W/WORTHING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WORTMAN.json b/inst/extdata/OSD/W/WORTMAN.json index 3eacb2fde6..bff4b4d878 100644 --- a/inst/extdata/OSD/W/WORTMAN.json +++ b/inst/extdata/OSD/W/WORTMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well or moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/W/WOVER.json b/inst/extdata/OSD/W/WOVER.json index 955fc6db29..d69507c6a8 100644 --- a/inst/extdata/OSD/W/WOVER.json +++ b/inst/extdata/OSD/W/WOVER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", - "drainage_overview": "poorly and very poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/W/WRENTHAM.json b/inst/extdata/OSD/W/WRENTHAM.json index e16966613b..04bf9c659a 100644 --- a/inst/extdata/OSD/W/WRENTHAM.json +++ b/inst/extdata/OSD/W/WRENTHAM.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WRIGHTMAN.json b/inst/extdata/OSD/W/WRIGHTMAN.json index 798e569210..6bf4d5f79d 100644 --- a/inst/extdata/OSD/W/WRIGHTMAN.json +++ b/inst/extdata/OSD/W/WRIGHTMAN.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/W/WULIE.json b/inst/extdata/OSD/W/WULIE.json index 02ffc19785..e09061c236 100644 --- a/inst/extdata/OSD/W/WULIE.json +++ b/inst/extdata/OSD/W/WULIE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/W/WUNJEY.json b/inst/extdata/OSD/W/WUNJEY.json index 587a1163da..00559f8bbc 100644 --- a/inst/extdata/OSD/W/WUNJEY.json +++ b/inst/extdata/OSD/W/WUNJEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well to well", + "drainage": "well, moderately well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/W/WURTSBORO.json b/inst/extdata/OSD/W/WURTSBORO.json index 042dc17948..ac9c4259a3 100644 --- a/inst/extdata/OSD/W/WURTSBORO.json +++ b/inst/extdata/OSD/W/WURTSBORO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "moderately well" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/W/WYASKET.json b/inst/extdata/OSD/W/WYASKET.json index 5c815e7fd8..7d8141b823 100644 --- a/inst/extdata/OSD/W/WYASKET.json +++ b/inst/extdata/OSD/W/WYASKET.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "poorly and very poorly", + "drainage": "poorly, very poorly", "drainage_overview": "poorly" } ] diff --git a/inst/extdata/OSD/W/WYETH.json b/inst/extdata/OSD/W/WYETH.json index fb72a2cbff..760a3583b7 100644 --- a/inst/extdata/OSD/W/WYETH.json +++ b/inst/extdata/OSD/W/WYETH.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/X/XAVIER.json b/inst/extdata/OSD/X/XAVIER.json index 478ce4715d..44d7069249 100644 --- a/inst/extdata/OSD/X/XAVIER.json +++ b/inst/extdata/OSD/X/XAVIER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/Y/YAKI.json b/inst/extdata/OSD/Y/YAKI.json index 829baeadd6..2dc2414b7d 100644 --- a/inst/extdata/OSD/Y/YAKI.json +++ b/inst/extdata/OSD/Y/YAKI.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YAKIMA.json b/inst/extdata/OSD/Y/YAKIMA.json index 752246e2ec..d640dacb49 100644 --- a/inst/extdata/OSD/Y/YAKIMA.json +++ b/inst/extdata/OSD/Y/YAKIMA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YALLANI.json b/inst/extdata/OSD/Y/YALLANI.json index 05558f62fc..2c244126a3 100644 --- a/inst/extdata/OSD/Y/YALLANI.json +++ b/inst/extdata/OSD/Y/YALLANI.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Y/YAMHILL.json b/inst/extdata/OSD/Y/YAMHILL.json index a666c18a2f..bc7f4045c8 100644 --- a/inst/extdata/OSD/Y/YAMHILL.json +++ b/inst/extdata/OSD/Y/YAMHILL.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/Y/YANCEYVILLE.json b/inst/extdata/OSD/Y/YANCEYVILLE.json index bd20856a4c..c577bc4abd 100644 --- a/inst/extdata/OSD/Y/YANCEYVILLE.json +++ b/inst/extdata/OSD/Y/YANCEYVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "well", + "drainage": "excessively, somewhat excessively, well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YANKEE.json b/inst/extdata/OSD/Y/YANKEE.json index 62ee558fbb..8ca44fecdf 100644 --- a/inst/extdata/OSD/Y/YANKEE.json +++ b/inst/extdata/OSD/Y/YANKEE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Y/YARDLEY.json b/inst/extdata/OSD/Y/YARDLEY.json index 8f8305de64..2829d1c40f 100644 --- a/inst/extdata/OSD/Y/YARDLEY.json +++ b/inst/extdata/OSD/Y/YARDLEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "" } ] diff --git a/inst/extdata/OSD/Y/YAUPON.json b/inst/extdata/OSD/Y/YAUPON.json index 5c3ec4c630..568de61264 100644 --- a/inst/extdata/OSD/Y/YAUPON.json +++ b/inst/extdata/OSD/Y/YAUPON.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly to moderately well", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/Y/YAWKEY.json b/inst/extdata/OSD/Y/YAWKEY.json index 2a30296854..2d08e03d77 100644 --- a/inst/extdata/OSD/Y/YAWKEY.json +++ b/inst/extdata/OSD/Y/YAWKEY.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YEATES_HOLLOW.json b/inst/extdata/OSD/Y/YEATES_HOLLOW.json index 84ccaeca21..bd3385546f 100644 --- a/inst/extdata/OSD/Y/YEATES_HOLLOW.json +++ b/inst/extdata/OSD/Y/YEATES_HOLLOW.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well and moderately well", - "drainage_overview": "well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/Y/YELLOWBOTTOM.json b/inst/extdata/OSD/Y/YELLOWBOTTOM.json index 357012b256..abb6d86daf 100644 --- a/inst/extdata/OSD/Y/YELLOWBOTTOM.json +++ b/inst/extdata/OSD/Y/YELLOWBOTTOM.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Y/YODER.json b/inst/extdata/OSD/Y/YODER.json index b91e3b9ad4..51c00950e5 100644 --- a/inst/extdata/OSD/Y/YODER.json +++ b/inst/extdata/OSD/Y/YODER.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well to somewhat excessively", - "drainage_overview": "well to somewhat excessively" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/Y/YORBA.json b/inst/extdata/OSD/Y/YORBA.json index e2f3f2079a..afc240ea34 100644 --- a/inst/extdata/OSD/Y/YORBA.json +++ b/inst/extdata/OSD/Y/YORBA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Y/YORKVILLE.json b/inst/extdata/OSD/Y/YORKVILLE.json index 4d43fd1889..c1872ff1d6 100644 --- a/inst/extdata/OSD/Y/YORKVILLE.json +++ b/inst/extdata/OSD/Y/YORKVILLE.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "moderately well and well", + "drainage": "well, moderately well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YRIBARREN.json b/inst/extdata/OSD/Y/YRIBARREN.json index d226f50ba8..6fc0f9e386 100644 --- a/inst/extdata/OSD/Y/YRIBARREN.json +++ b/inst/extdata/OSD/Y/YRIBARREN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Y/YUBA.json b/inst/extdata/OSD/Y/YUBA.json index 3d1966333b..a3c1b4bea9 100644 --- a/inst/extdata/OSD/Y/YUBA.json +++ b/inst/extdata/OSD/Y/YUBA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "moderately well" } ] diff --git a/inst/extdata/OSD/Z/ZAAR.json b/inst/extdata/OSD/Z/ZAAR.json index dfcf1199f1..0893f82983 100644 --- a/inst/extdata/OSD/Z/ZAAR.json +++ b/inst/extdata/OSD/Z/ZAAR.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "somewhat poorly", - "drainage_overview": "somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/Z/ZACA.json b/inst/extdata/OSD/Z/ZACA.json index 287f3bbefe..829995a277 100644 --- a/inst/extdata/OSD/Z/ZACA.json +++ b/inst/extdata/OSD/Z/ZACA.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Z/ZAMORA.json b/inst/extdata/OSD/Z/ZAMORA.json index 6ab12f4a49..5bec56a003 100644 --- a/inst/extdata/OSD/Z/ZAMORA.json +++ b/inst/extdata/OSD/Z/ZAMORA.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Z/ZAPADNI.json b/inst/extdata/OSD/Z/ZAPADNI.json index d657f88294..85e9c1f801 100644 --- a/inst/extdata/OSD/Z/ZAPADNI.json +++ b/inst/extdata/OSD/Z/ZAPADNI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Z/ZEEBAR.json b/inst/extdata/OSD/Z/ZEEBAR.json index 8e21e4f229..658431beb6 100644 --- a/inst/extdata/OSD/Z/ZEEBAR.json +++ b/inst/extdata/OSD/Z/ZEEBAR.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Z/ZEESIX.json b/inst/extdata/OSD/Z/ZEESIX.json index 4c7514449e..28b372f42f 100644 --- a/inst/extdata/OSD/Z/ZEESIX.json +++ b/inst/extdata/OSD/Z/ZEESIX.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Z/ZENIFF.json b/inst/extdata/OSD/Z/ZENIFF.json index 20b911aa8c..2b66d98734 100644 --- a/inst/extdata/OSD/Z/ZENIFF.json +++ b/inst/extdata/OSD/Z/ZENIFF.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Z/ZIA.json b/inst/extdata/OSD/Z/ZIA.json index 140971fff9..aff9d0e76f 100644 --- a/inst/extdata/OSD/Z/ZIA.json +++ b/inst/extdata/OSD/Z/ZIA.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "well", - "drainage_overview": "well" + "drainage": "somewhat excessively, well", + "drainage_overview": "somewhat excessively, well" } ] ], diff --git a/inst/extdata/OSD/Z/ZING.json b/inst/extdata/OSD/Z/ZING.json index e282e90fd0..b4cf10dd83 100644 --- a/inst/extdata/OSD/Z/ZING.json +++ b/inst/extdata/OSD/Z/ZING.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well or somewhat poorly", - "drainage_overview": "moderately well or somewhat poorly" + "drainage": "moderately well, somewhat poorly", + "drainage_overview": "moderately well, somewhat poorly" } ] ], diff --git a/inst/extdata/OSD/Z/ZIPP.json b/inst/extdata/OSD/Z/ZIPP.json index 8efb328a1e..38e95a594b 100644 --- a/inst/extdata/OSD/Z/ZIPP.json +++ b/inst/extdata/OSD/Z/ZIPP.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/Z/ZOATE.json b/inst/extdata/OSD/Z/ZOATE.json index 407bc19fa0..b75c7023cf 100644 --- a/inst/extdata/OSD/Z/ZOATE.json +++ b/inst/extdata/OSD/Z/ZOATE.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "", - "drainage_overview": "" + "drainage": "well", + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Z/ZOLOTOI.json b/inst/extdata/OSD/Z/ZOLOTOI.json index 025d5f3dfc..94e43b73b5 100644 --- a/inst/extdata/OSD/Z/ZOLOTOI.json +++ b/inst/extdata/OSD/Z/ZOLOTOI.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/inst/extdata/OSD/Z/ZOOK.json b/inst/extdata/OSD/Z/ZOOK.json index e470ef8701..e8cacefad6 100644 --- a/inst/extdata/OSD/Z/ZOOK.json +++ b/inst/extdata/OSD/Z/ZOOK.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "very poorly", - "drainage_overview": "poorly" + "drainage": "poorly, very poorly", + "drainage_overview": "poorly, very poorly" } ] ], diff --git a/inst/extdata/OSD/Z/ZUKAN.json b/inst/extdata/OSD/Z/ZUKAN.json index ed224185a8..a4bafee705 100644 --- a/inst/extdata/OSD/Z/ZUKAN.json +++ b/inst/extdata/OSD/Z/ZUKAN.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Z/ZUMBRO.json b/inst/extdata/OSD/Z/ZUMBRO.json index 0da8e49a6f..6789cf78e8 100644 --- a/inst/extdata/OSD/Z/ZUMBRO.json +++ b/inst/extdata/OSD/Z/ZUMBRO.json @@ -64,8 +64,8 @@ "SITE": [ [ { - "drainage": "moderately well", - "drainage_overview": "well and moderately well" + "drainage": "well, moderately well", + "drainage_overview": "well, moderately well" } ] ], diff --git a/inst/extdata/OSD/Z/ZUNKER.json b/inst/extdata/OSD/Z/ZUNKER.json index 833bff1e2f..c5b59df794 100644 --- a/inst/extdata/OSD/Z/ZUNKER.json +++ b/inst/extdata/OSD/Z/ZUNKER.json @@ -64,7 +64,7 @@ "SITE": [ [ { - "drainage": "", + "drainage": "well", "drainage_overview": "well" } ] diff --git a/inst/extdata/OSD/Z/ZYPLAR.json b/inst/extdata/OSD/Z/ZYPLAR.json index 7adc98112a..3eb9d111f8 100644 --- a/inst/extdata/OSD/Z/ZYPLAR.json +++ b/inst/extdata/OSD/Z/ZYPLAR.json @@ -65,7 +65,7 @@ [ { "drainage": "well", - "drainage_overview": "" + "drainage_overview": "well" } ] ], diff --git a/man/create_OSD.Rd b/man/create_OSD.Rd index 33e94e65a0..c519e377c2 100644 --- a/man/create_OSD.Rd +++ b/man/create_OSD.Rd @@ -4,10 +4,12 @@ \alias{create_OSD} \title{Create OSD Dataset} \usage{ -create_OSD(...) +create_OSD(..., download = TRUE) } \arguments{ \item{...}{not used} + +\item{download}{_logical_. Download OSD Snapshot from OSDRegistry? Default: `TRUE`} } \value{ TRUE if successful