diff --git a/DESCRIPTION b/DESCRIPTION
index 54a21509..586cfdee 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,6 +1,6 @@
Type: Package
Package: PWFSLSmoke
-Version: 1.2.113
+Version: 1.2.114
Title: Utilities for Working with Air Quality Monitoring Data
Authors@R: c(
person("Jonathan", "Callahan", email="jonathan.s.callahan@gmail.com", role=c("aut","cre")),
diff --git a/NEWS.md b/NEWS.md
index b21ff1f6..be315fe9 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,3 +1,7 @@
+# PWFSLSmoke 1.2.114
+
+* Updated AIRSIS EBAM QC RHi threshold from 45% to 50%.
+
# PWFSLSmoke 1.2.113
* Updated `docker/` files to use R 3.6.3.
diff --git a/R/airsis_BAM1020QualityControl.R b/R/airsis_BAM1020QualityControl.R
index bf892fd2..543a4f75 100644
--- a/R/airsis_BAM1020QualityControl.R
+++ b/R/airsis_BAM1020QualityControl.R
@@ -93,7 +93,7 @@ airsis_BAM1020QualityControl <- function(
badRowCount <- sum(badRows)
if ( badRowCount > 0 ) {
logger.trace(paste(verb,"%s rows with invalid location information"), badRowCount)
- badLocations <- paste('(',tbl$Longitude[badRows],',',tbl$Latitude[badRows],')',sep='')
+ badLocations <- paste('(',tbl$Longitude[badRows],',',tbl$Latitude[badRows],')',sep = '')
logger.trace("Bad locations: %s", unique(badLocations))
if ( flagAndKeep ) {
# apply flags
@@ -112,18 +112,18 @@ airsis_BAM1020QualityControl <- function(
if (nrow(tbl) < 1 && !flagAndKeep) {
err_msg <- paste0("No valid PM2.5 data for ", monitorName)
logger.warn(err_msg) # This is more of a warning than some error in the data.
- stop(err_msg, call.=FALSE)
+ stop(err_msg, call. = FALSE)
}
# ----- Time ----------------------------------------------------------------
# Add a POSIXct datetime
- tbl$datetime <- lubridate::floor_date(lubridate::mdy_hms(tbl$TimeStamp), unit="hour") - lubridate::dhours(1)
+ tbl$datetime <- lubridate::floor_date(lubridate::mdy_hms(tbl$TimeStamp), unit = "hour") - lubridate::dhours(1)
if ( flagAndKeep ) {
# TODO: Unable to get datetime moved from tbl to tblFlagged without timezone and/or display getting messed up.
# For now just duplicating the calculation, then assigning row values to NA after the fact for rows that were
# removed from tbl prior to calculating datetime above. Clean up later if possible.
- tblFlagged$datetime <- lubridate::floor_date(lubridate::mdy_hms(tblFlagged$TimeStamp), unit="hour") - lubridate::dhours(1)
+ tblFlagged$datetime <- lubridate::floor_date(lubridate::mdy_hms(tblFlagged$TimeStamp), unit = "hour") - lubridate::dhours(1)
tblFlagged$datetime[ which(!(tblFlagged$rowID %in% tbl$rowID)) ] <- NA
}
@@ -165,15 +165,15 @@ airsis_BAM1020QualityControl <- function(
gooddatetime <- !is.na(tbl$datetime) & tbl$datetime < lubridate::now(tzone = "UTC") # saw a future date once
logger.trace("Flow has %s missing or out of range values", sum(!goodFlow))
- if (sum(!goodFlow) > 0) logger.trace("Bad Flow values: %s", paste0(sort(unique(tbl$Qtot..m3.[!goodFlow]),na.last=TRUE), collapse=", "))
+ if (sum(!goodFlow) > 0) logger.trace("Bad Flow values: %s", paste0(sort(unique(tbl$Qtot..m3.[!goodFlow]),na.last = TRUE), collapse = ", "))
logger.trace("AT has %s missing or out of range values", sum(!goodAT))
- if (sum(!goodAT) > 0) logger.trace("Bad AT values: %s", paste0(sort(unique(tbl$Ambient.Temp..C.[!goodAT]),na.last=TRUE), collapse=", "))
+ if (sum(!goodAT) > 0) logger.trace("Bad AT values: %s", paste0(sort(unique(tbl$Ambient.Temp..C.[!goodAT]),na.last = TRUE), collapse = ", "))
logger.trace("RHi has %s missing or out of range values", sum(!goodRHi))
- if (sum(!goodRHi) > 0) logger.trace("Bad RHi values: %s", paste0(sort(unique(tbl$RH....[!goodRHi]),na.last=TRUE), collapse=", "))
+ if (sum(!goodRHi) > 0) logger.trace("Bad RHi values: %s", paste0(sort(unique(tbl$RH....[!goodRHi]),na.last = TRUE), collapse = ", "))
logger.trace("Conc has %s missing or out of range values", sum(!goodConcHr))
- if (sum(!goodConcHr) > 0) logger.trace("Bad Conc values: %s", paste0(sort(unique(tbl$'Conc..\u00B5g.m3.'[!goodConcHr]),na.last=TRUE), collapse=", "))
+ if (sum(!goodConcHr) > 0) logger.trace("Bad Conc values: %s", paste0(sort(unique(tbl$'Conc..\u00B5g.m3.'[!goodConcHr]),na.last = TRUE), collapse = ", "))
logger.trace("datetime has %s missing or out of range values", sum(!gooddatetime))
- if (sum(!gooddatetime) > 0) logger.trace("Bad datetime values: %s", paste0(sort(unique(tbl$datetime[!gooddatetime]),na.last=TRUE), collapse=", "))
+ if (sum(!gooddatetime) > 0) logger.trace("Bad datetime values: %s", paste0(sort(unique(tbl$datetime[!gooddatetime]),na.last = TRUE), collapse = ", "))
goodMask <- goodFlow & goodAT & goodRHi & goodConcHr & gooddatetime
badQCCount <- sum(!goodMask)
@@ -204,7 +204,7 @@ airsis_BAM1020QualityControl <- function(
if (nrow(tbl) < 1 && !flagAndKeep) {
err_msg <- paste0("No valid PM2.5 data for ", monitorName)
logger.warn(err_msg) # This is more of a warning than some error in the data.
- stop(err_msg, call.=FALSE)
+ stop(err_msg, call. = FALSE)
}
# ----- Duplicate Hours -----------------------------------------------------
@@ -220,7 +220,7 @@ airsis_BAM1020QualityControl <- function(
if ( dupHrCount > 0 ) {
logger.trace(paste(verb,"%s duplicate time entries"), dupHrCount)
- logger.trace("Duplicate Hours (may be >1 per timestamp): %s", paste0(sort(unique(tbl$TimeStamp[dupHrMask])), collapse=", "))
+ logger.trace("Duplicate Hours (may be >1 per timestamp): %s", paste0(sort(unique(tbl$TimeStamp[dupHrMask])), collapse = ", "))
if ( flagAndKeep ) {
# apply flags
tblFlagged$QCFlag_duplicateHr[tbl$rowID[dupHrMask]] <- TRUE
@@ -236,7 +236,7 @@ airsis_BAM1020QualityControl <- function(
if (nrow(tbl) < 1 && !flagAndKeep) {
err_msg <- paste0("No valid PM2.5 data for ", monitorName)
logger.warn(err_msg) # This is more of a warning than some error in the data.
- stop(err_msg, call.=FALSE)
+ stop(err_msg, call. = FALSE)
}
# ----- More QC -------------------------------------------------------------
diff --git a/R/airsis_EBAMQualityControl.R b/R/airsis_EBAMQualityControl.R
index f4f46930..62fe9447 100644
--- a/R/airsis_EBAMQualityControl.R
+++ b/R/airsis_EBAMQualityControl.R
@@ -37,7 +37,7 @@ airsis_EBAMQualityControl <- function(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7*0.95,16.7*1.05),
valid_AT = c(-Inf,45),
- valid_RHi = c(-Inf,45),
+ valid_RHi = c(-Inf,50),
valid_Conc = c(-Inf,5.000),
flagAndKeep = FALSE
) {
@@ -176,6 +176,7 @@ airsis_EBAMQualityControl <- function(
# Leland Tarnay QC -----------------------------------------------------------
# NOTE: Override ConcHr high value with 5.000 as per conversation with Mike Broughton
+ # NOTE: 2021-07-07 Update RHi from 45 -> 50 as per conversation with Pete Lahm
###tmp.2014_YOSE_ebam1_ftp$concQA <- with(tmp.2014_YOSE_ebam1_ftp,
### ifelse(Flow < 16.7 * .95, "FlowLow",
diff --git a/R/airsis_EBAM_MULTI2QualityControl.R b/R/airsis_EBAM_MULTI2QualityControl.R
index a929b46b..508a113c 100644
--- a/R/airsis_EBAM_MULTI2QualityControl.R
+++ b/R/airsis_EBAM_MULTI2QualityControl.R
@@ -39,7 +39,7 @@ airsis_EBAM_MULTI2QualityControl <- function(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7*0.95,16.7*1.05),
valid_AT = c(-Inf,45),
- valid_RHi = c(-Inf,45),
+ valid_RHi = c(-Inf,50),
valid_Conc = c(-Inf,5.000),
flagAndKeep = FALSE
) {
@@ -178,6 +178,7 @@ airsis_EBAM_MULTI2QualityControl <- function(
# Leland Tarnay QC -----------------------------------------------------------
# NOTE: Override ConcHr high value with 5.000 as per conversation with Mike Broughton
+ # NOTE: 2021-07-07 Update RHi from 45 -> 50 as per conversation with Pete Lahm
###tmp.2014_YOSE_ebam1_ftp$concQA <- with(tmp.2014_YOSE_ebam1_ftp,
### ifelse(Flow < 16.7 * .95, "FlowLow",
diff --git a/R/airsis_EBAM_PLUS_MULTIQualityControl.R b/R/airsis_EBAM_PLUS_MULTIQualityControl.R
index 5373dd6e..318f1a47 100644
--- a/R/airsis_EBAM_PLUS_MULTIQualityControl.R
+++ b/R/airsis_EBAM_PLUS_MULTIQualityControl.R
@@ -39,7 +39,7 @@ airsis_EBAM_PLUS_MULTIQualityControl <- function(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7*0.95,16.7*1.05),
valid_AT = c(-Inf,45),
- valid_RHi = c(-Inf,45),
+ valid_RHi = c(-Inf,50),
valid_Conc = c(-Inf,5.000),
flagAndKeep = FALSE
) {
@@ -180,6 +180,7 @@ airsis_EBAM_PLUS_MULTIQualityControl <- function(
# Leland Tarnay QC -----------------------------------------------------------
# NOTE: Override ConcHr high value with 5.000 as per conversation with Mike Broughton
+ # NOTE: 2021-07-07 Update RHi from 45 -> 50 as per conversation with Pete Lahm
###tmp.2014_YOSE_ebam1_ftp$concQA <- with(tmp.2014_YOSE_ebam1_ftp,
### ifelse(Flow < 16.7 * .95, "FlowLow",
@@ -297,19 +298,3 @@ airsis_EBAM_PLUS_MULTIQualityControl <- function(
}
-# ===== DEBUGGING ==============================================================
-
-if ( FALSE ) {
-
- # tbl <- ...
- valid_Longitude = c(-180,180)
- valid_Latitude = c(-90,90)
- remove_Lon_zero = TRUE
- remove_Lat_zero = TRUE
- valid_Flow = c(16.7*0.95,16.7*1.05)
- valid_AT = c(-Inf,45)
- valid_RHi = c(-Inf,45)
- valid_Conc = c(-Inf,5.000)
- flagAndKeep = FALSE
-
-}
diff --git a/R/airsis_createMonitorObject.R b/R/airsis_createMonitorObject.R
index 3fdb4d46..79604820 100644
--- a/R/airsis_createMonitorObject.R
+++ b/R/airsis_createMonitorObject.R
@@ -42,7 +42,7 @@
#' \item{\code{remove_Lat_zero = TRUE}}
#' \item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
#' \item{\code{valid_AT = c(-Inf,45)}}
-#' \item{\code{valid_RHi = c(-Inf,45)}}
+#' \item{\code{valid_RHi = c(-Inf,50)}}
#' \item{\code{valid_Conc = c(-Inf,5.000)}}
#' }
#'
diff --git a/R/airsis_qualityControl.R b/R/airsis_qualityControl.R
index c33236c1..acc01796 100644
--- a/R/airsis_qualityControl.R
+++ b/R/airsis_qualityControl.R
@@ -26,7 +26,7 @@
#' \item{\code{remove_Lat_zero = TRUE}}
#' \item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
#' \item{\code{valid_AT = c(-Inf,45)}}
-#' \item{\code{valid_RHi = c(-Inf,45)}}
+#' \item{\code{valid_RHi = c(-Inf,50)}}
#' \item{\code{valid_Conc = c(-Inf,5.000)}}
#' }
#'
diff --git a/R/wrcc_EBAMQualityControl.R b/R/wrcc_EBAMQualityControl.R
index 334c29dd..5f970008 100644
--- a/R/wrcc_EBAMQualityControl.R
+++ b/R/wrcc_EBAMQualityControl.R
@@ -44,7 +44,7 @@ wrcc_EBAMQualityControl <- function(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7*0.95,16.7*1.05),
valid_AT = c(-Inf,45),
- valid_RHi = c(-Inf,45),
+ valid_RHi = c(-Inf,50),
valid_Conc = c(-Inf,5000),
flagAndKeep = FALSE
) {
@@ -170,6 +170,7 @@ wrcc_EBAMQualityControl <- function(
# Leland Tarnay QC for E-BAM ------------------------------------------------
# NOTE: Override ConcHr high value with 5000 as per conversation with Mike Broughton
+ # NOTE: 2021-07-07 Update RHi from 45 -> 50 as per conversation with Pete Lahm
###tmp.2014_YOSE_ebam1_ftp$concQA <- with(tmp.2014_YOSE_ebam1_ftp,
### ifelse(Flow < 16.7 * .95, "FlowLow",
diff --git a/R/wrcc_createMonitorObject.R b/R/wrcc_createMonitorObject.R
index 39d7adfd..53e519df 100644
--- a/R/wrcc_createMonitorObject.R
+++ b/R/wrcc_createMonitorObject.R
@@ -41,7 +41,7 @@
#' \item{\code{remove_Lat_zero = TRUE}}
#' \item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
#' \item{\code{valid_AT = c(-Inf,45)}}
-#' \item{\code{valid_RHi = c(-Inf,45)}}
+#' \item{\code{valid_RHi = c(-Inf,50)}}
#' \item{\code{valid_Conc = c(-Inf,5000)}}
#' }
#'
diff --git a/docs/404.html b/docs/404.html
index c2ffed9c..e94eac19 100644
--- a/docs/404.html
+++ b/docs/404.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html
index aef1dfe5..17ebeb6f 100644
--- a/docs/LICENSE-text.html
+++ b/docs/LICENSE-text.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/articles/Data_Model.html b/docs/articles/Data_Model.html
index 17b100e7..33b97bd6 100644
--- a/docs/articles/Data_Model.html
+++ b/docs/articles/Data_Model.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/articles/Maps_and_Timeseries_Plots.html b/docs/articles/Maps_and_Timeseries_Plots.html
index 03172b50..7e0ee867 100644
--- a/docs/articles/Maps_and_Timeseries_Plots.html
+++ b/docs/articles/Maps_and_Timeseries_Plots.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/articles/NowCast.html b/docs/articles/NowCast.html
index e31604d5..55a7f76d 100644
--- a/docs/articles/NowCast.html
+++ b/docs/articles/NowCast.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/articles/PWFSLSmoke.html b/docs/articles/PWFSLSmoke.html
index c9cbe06a..74d0fbf3 100644
--- a/docs/articles/PWFSLSmoke.html
+++ b/docs/articles/PWFSLSmoke.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -225,8 +225,8 @@
We can display these monitors (colored by maximum PM2.5 value) in an interactive map, zoom in and click on the monitor in downtown Sacramento to get it’s monitorID
:
-
-We can use this monitorID
to create a ws_monitor object for this single monitor and take a look at a timeseries plot:
+
+We can use this monitorID
to create a ws_monitor object for this single monitor and take a look at a timeseries plot:
Sacramento <-
camp_fire %>%
@@ -254,8 +254,8 @@
-
-We can display the hourly data for all the monitors and add day/night shading:
+
+We can display the hourly data for all the monitors and add day/night shading:
monitor_timeseriesPlot(Sacramento_area,
style = 'gnats',
diff --git a/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html b/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html
index 127a51df..8f5c64d2 100644
--- a/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html
+++ b/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -138,8 +138,8 @@ Zooming in and clicking on individual monitoring sites, we can create a collection of monitorIDs for which we will build a ws_monitor object for further inspection
+
+Zooming in and clicking on individual monitoring sites, we can create a collection of monitorIDs for which we will build a ws_monitor object for further inspection
# Vector of monitorIDs
monitorIDs <- c("080310002_01", "080131001_01", "080130003_01", "081230006_01",
@@ -155,8 +155,8 @@
# Another leaflet map showing max AQI values
monitor_leaflet(my_monitors)
-
-Indeed, the map shows that the main cities along the Front Range experienced poor air quality indexes (AQI) with PM2.5 reaching USG (unhealthy for sensitive groups) and Unhealthy levels.
+
+Indeed, the map shows that the main cities along the Front Range experienced poor air quality indexes (AQI) with PM2.5 reaching USG (unhealthy for sensitive groups) and Unhealthy levels.
We can explore PM2.5 levels in detail with a “dygraph” interactive timeseries plot:
monitor_dygraph(
@@ -164,8 +164,8 @@
title = "Front Range AQIs - Feb 15 - 18, 2021",
showLegend = TRUE
)
-
-The PWFSLSmoke package also provides a baseplot timeseries plot that can be used to show all the data points in a publication-ready graphic:
+
+The PWFSLSmoke package also provides a baseplot timeseries plot that can be used to show all the data points in a publication-ready graphic:
monitor_timeseriesPlot(my_monitors, style = "gnats")
addAQIStackedBar()
diff --git a/docs/articles/articles/Example_Save_Data_as_CSV.html b/docs/articles/articles/Example_Save_Data_as_CSV.html
index 01705019..cdad7dcf 100644
--- a/docs/articles/articles/Example_Save_Data_as_CSV.html
+++ b/docs/articles/articles/Example_Save_Data_as_CSV.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/articles/articles/Loading_Monitoring_Data.html b/docs/articles/articles/Loading_Monitoring_Data.html
index ef135772..607baf3a 100644
--- a/docs/articles/articles/Loading_Monitoring_Data.html
+++ b/docs/articles/articles/Loading_Monitoring_Data.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -192,7 +192,7 @@
parameter = 'PM2.5',
baseUrl = "https://haze.airfire.org/monitoring/latest/RData",
dataDir = NULL)
-
~__loadDaily()` - for daily updates covering the most recent 45 days
+~_loadDaily()` - for daily updates covering the most recent 45 days
airnow_loadDaily(
parameter = 'PM2.5',
@@ -208,7 +208,7 @@
These functions are typically used with default settings for parameter
, baseUrl
and dataDir
:
airnow_latest <- airnow_loadLatest()
wrcc_daily <- wrcc_lodDaily()
-_ NOTE:_ If dataDir
is specified, data will be preferentially loaded from a local directory rather than from baseUrl
.
+NOTE: If dataDir
is specified, data will be preferentially loaded from a local directory rather than from baseUrl
.
diff --git a/docs/articles/articles/Loading_Monitoring_Data_files/figure-html/loadLatest WA-1.png b/docs/articles/articles/Loading_Monitoring_Data_files/figure-html/loadLatest WA-1.png
index 68d7d9af..d2322385 100644
Binary files a/docs/articles/articles/Loading_Monitoring_Data_files/figure-html/loadLatest WA-1.png and b/docs/articles/articles/Loading_Monitoring_Data_files/figure-html/loadLatest WA-1.png differ
diff --git a/docs/articles/index.html b/docs/articles/index.html
index 90ceef9b..0244b2a8 100644
--- a/docs/articles/index.html
+++ b/docs/articles/index.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/authors.html b/docs/authors.html
index dcb7c99a..56a7e8c3 100644
--- a/docs/authors.html
+++ b/docs/authors.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/index.html b/docs/index.html
index 97166586..989aaca5 100644
--- a/docs/index.html
+++ b/docs/index.html
@@ -46,7 +46,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/news/index.html b/docs/news/index.html
index 3acd5170..1d69604c 100644
--- a/docs/news/index.html
+++ b/docs/news/index.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -151,6 +151,14 @@ Changelog
Source: NEWS.md
+
+
+
+- Updated AIRSIS EBAM QC RHi threshold from 45% to 50%.
+
+
diff --git a/docs/reference/AQI.html b/docs/reference/AQI.html
index 0062fa1c..46d19b9d 100644
--- a/docs/reference/AQI.html
+++ b/docs/reference/AQI.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/AQI_en.html b/docs/reference/AQI_en.html
index 700f5dbb..38ce38ab 100644
--- a/docs/reference/AQI_en.html
+++ b/docs/reference/AQI_en.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/AQI_es.html b/docs/reference/AQI_es.html
index 088d668c..985d5483 100644
--- a/docs/reference/AQI_es.html
+++ b/docs/reference/AQI_es.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/CONUS.html b/docs/reference/CONUS.html
index e34e8d56..55659086 100644
--- a/docs/reference/CONUS.html
+++ b/docs/reference/CONUS.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/Carmel_Valley.html b/docs/reference/Carmel_Valley.html
index 45cf7647..da75f890 100644
--- a/docs/reference/Carmel_Valley.html
+++ b/docs/reference/Carmel_Valley.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/Northwest_Megafires.html b/docs/reference/Northwest_Megafires.html
index c8f947f7..c3c1627e 100644
--- a/docs/reference/Northwest_Megafires.html
+++ b/docs/reference/Northwest_Megafires.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/PWFSLSmoke-deprecated.html b/docs/reference/PWFSLSmoke-deprecated.html
index 77a6f351..f0479940 100644
--- a/docs/reference/PWFSLSmoke-deprecated.html
+++ b/docs/reference/PWFSLSmoke-deprecated.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/US_52.html b/docs/reference/US_52.html
index efb24bb2..c2c28ae3 100644
--- a/docs/reference/US_52.html
+++ b/docs/reference/US_52.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/WRCC.html b/docs/reference/WRCC.html
index 24d53029..ef5b2e44 100644
--- a/docs/reference/WRCC.html
+++ b/docs/reference/WRCC.html
@@ -90,7 +90,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addAQILegend.html b/docs/reference/addAQILegend.html
index b30797b3..3a281c6b 100644
--- a/docs/reference/addAQILegend.html
+++ b/docs/reference/addAQILegend.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addAQILines.html b/docs/reference/addAQILines.html
index 5c875ba3..c326a87d 100644
--- a/docs/reference/addAQILines.html
+++ b/docs/reference/addAQILines.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addAQIStackedBar.html b/docs/reference/addAQIStackedBar.html
index dd2d87d3..c854b80e 100644
--- a/docs/reference/addAQIStackedBar.html
+++ b/docs/reference/addAQIStackedBar.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addBullseye.html b/docs/reference/addBullseye.html
index 5b337798..767ef657 100644
--- a/docs/reference/addBullseye.html
+++ b/docs/reference/addBullseye.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addClustering.html b/docs/reference/addClustering.html
index 0a554022..d76402a2 100644
--- a/docs/reference/addClustering.html
+++ b/docs/reference/addClustering.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addEsriAddress.html b/docs/reference/addEsriAddress.html
index 547f343e..9fde3b96 100644
--- a/docs/reference/addEsriAddress.html
+++ b/docs/reference/addEsriAddress.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addGoogleAddress.html b/docs/reference/addGoogleAddress.html
index 9df76b80..70c4d241 100644
--- a/docs/reference/addGoogleAddress.html
+++ b/docs/reference/addGoogleAddress.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addGoogleElevation.html b/docs/reference/addGoogleElevation.html
index 54af8367..df4186a0 100644
--- a/docs/reference/addGoogleElevation.html
+++ b/docs/reference/addGoogleElevation.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addIcon.html b/docs/reference/addIcon.html
index b3156f70..a907c1fc 100644
--- a/docs/reference/addIcon.html
+++ b/docs/reference/addIcon.html
@@ -86,7 +86,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addMarker.html b/docs/reference/addMarker.html
index dfac9e78..4d15c2ff 100644
--- a/docs/reference/addMarker.html
+++ b/docs/reference/addMarker.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addMazamaMetadata.html b/docs/reference/addMazamaMetadata.html
index 8bf27da2..f737e787 100644
--- a/docs/reference/addMazamaMetadata.html
+++ b/docs/reference/addMazamaMetadata.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addPolygon.html b/docs/reference/addPolygon.html
index 2f69301e..dda104cb 100644
--- a/docs/reference/addPolygon.html
+++ b/docs/reference/addPolygon.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addShadedBackground.html b/docs/reference/addShadedBackground.html
index 1dc40c0d..b617ab05 100644
--- a/docs/reference/addShadedBackground.html
+++ b/docs/reference/addShadedBackground.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addShadedNight.html b/docs/reference/addShadedNight.html
index 32f353da..f351d722 100644
--- a/docs/reference/addShadedNight.html
+++ b/docs/reference/addShadedNight.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addUSGSElevation.html b/docs/reference/addUSGSElevation.html
index 627d987d..65211259 100644
--- a/docs/reference/addUSGSElevation.html
+++ b/docs/reference/addUSGSElevation.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addWindBarb.html b/docs/reference/addWindBarb.html
index 9fce25f5..36e29dde 100644
--- a/docs/reference/addWindBarb.html
+++ b/docs/reference/addWindBarb.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/addWindBarbs.html b/docs/reference/addWindBarbs.html
index 83e16bc3..b03d8662 100644
--- a/docs/reference/addWindBarbs.html
+++ b/docs/reference/addWindBarbs.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_createDataDataframes.html b/docs/reference/airnow_createDataDataframes.html
index cdcccfb6..eb6c476b 100644
--- a/docs/reference/airnow_createDataDataframes.html
+++ b/docs/reference/airnow_createDataDataframes.html
@@ -109,7 +109,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_createMetaDataframes.html b/docs/reference/airnow_createMetaDataframes.html
index 08a5037f..f84afe43 100644
--- a/docs/reference/airnow_createMetaDataframes.html
+++ b/docs/reference/airnow_createMetaDataframes.html
@@ -125,7 +125,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_createMonitorObjects.html b/docs/reference/airnow_createMonitorObjects.html
index a3e5d4f3..a3d027cd 100644
--- a/docs/reference/airnow_createMonitorObjects.html
+++ b/docs/reference/airnow_createMonitorObjects.html
@@ -106,7 +106,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_downloadHourlyData.html b/docs/reference/airnow_downloadHourlyData.html
index 6f8ad4da..0b169946 100644
--- a/docs/reference/airnow_downloadHourlyData.html
+++ b/docs/reference/airnow_downloadHourlyData.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_downloadParseData.html b/docs/reference/airnow_downloadParseData.html
index c1d45044..79ee2166 100644
--- a/docs/reference/airnow_downloadParseData.html
+++ b/docs/reference/airnow_downloadParseData.html
@@ -107,7 +107,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_downloadSites.html b/docs/reference/airnow_downloadSites.html
index 7f56a3f0..64600de3 100644
--- a/docs/reference/airnow_downloadSites.html
+++ b/docs/reference/airnow_downloadSites.html
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_load.html b/docs/reference/airnow_load.html
index d0194391..f1473cff 100644
--- a/docs/reference/airnow_load.html
+++ b/docs/reference/airnow_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_loadAnnual.html b/docs/reference/airnow_loadAnnual.html
index e2f58e74..f3b5a3e9 100644
--- a/docs/reference/airnow_loadAnnual.html
+++ b/docs/reference/airnow_loadAnnual.html
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_loadDaily.html b/docs/reference/airnow_loadDaily.html
index 3e8ab2ba..ec6cd975 100644
--- a/docs/reference/airnow_loadDaily.html
+++ b/docs/reference/airnow_loadDaily.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_loadLatest.html b/docs/reference/airnow_loadLatest.html
index f4ecfb6d..2f5ef8a8 100644
--- a/docs/reference/airnow_loadLatest.html
+++ b/docs/reference/airnow_loadLatest.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airnow_qualityControl.html b/docs/reference/airnow_qualityControl.html
index 6f93c36a..09a9d088 100644
--- a/docs/reference/airnow_qualityControl.html
+++ b/docs/reference/airnow_qualityControl.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_BAM1020QualityControl.html b/docs/reference/airsis_BAM1020QualityControl.html
index 3a736c10..6cc7a760 100644
--- a/docs/reference/airsis_BAM1020QualityControl.html
+++ b/docs/reference/airsis_BAM1020QualityControl.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_EBAMQualityControl.html b/docs/reference/airsis_EBAMQualityControl.html
index 511a37e2..48b52072 100644
--- a/docs/reference/airsis_EBAMQualityControl.html
+++ b/docs/reference/airsis_EBAMQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -181,7 +181,7 @@ Apply Quality Control to raw AIRSIS EBAM tibble
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/docs/reference/airsis_EBAM_MULTI2QualityControl.html b/docs/reference/airsis_EBAM_MULTI2QualityControl.html
index 35d9778a..a1be1745 100644
--- a/docs/reference/airsis_EBAM_MULTI2QualityControl.html
+++ b/docs/reference/airsis_EBAM_MULTI2QualityControl.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -185,7 +185,7 @@ Apply Quality Control to raw AIRSIS EBAM MULTI2 tibble
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html b/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
index 3ad2deaa..76a6c576 100644
--- a/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
+++ b/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -185,7 +185,7 @@ Apply Quality Control to raw AIRSIS EBAM PLUS_MULTI tibble
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/docs/reference/airsis_ESAMQualityControl.html b/docs/reference/airsis_ESAMQualityControl.html
index dd0a5540..8c9c7c10 100644
--- a/docs/reference/airsis_ESAMQualityControl.html
+++ b/docs/reference/airsis_ESAMQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_ESAM_MULTIQualityControl.html b/docs/reference/airsis_ESAM_MULTIQualityControl.html
index ddbf88a0..977f0718 100644
--- a/docs/reference/airsis_ESAM_MULTIQualityControl.html
+++ b/docs/reference/airsis_ESAM_MULTIQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_availableUnits.html b/docs/reference/airsis_availableUnits.html
index 8df691f4..d61b87e8 100644
--- a/docs/reference/airsis_availableUnits.html
+++ b/docs/reference/airsis_availableUnits.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_createDataDataframe.html b/docs/reference/airsis_createDataDataframe.html
index 7e86afec..161e118c 100644
--- a/docs/reference/airsis_createDataDataframe.html
+++ b/docs/reference/airsis_createDataDataframe.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_createMetaDataframe.html b/docs/reference/airsis_createMetaDataframe.html
index 74ecc838..dc536c18 100644
--- a/docs/reference/airsis_createMetaDataframe.html
+++ b/docs/reference/airsis_createMetaDataframe.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_createMonitorObject.html b/docs/reference/airsis_createMonitorObject.html
index 11d5f0db..f3363438 100644
--- a/docs/reference/airsis_createMonitorObject.html
+++ b/docs/reference/airsis_createMonitorObject.html
@@ -69,7 +69,7 @@
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5.000)
@@ -105,7 +105,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -202,7 +202,7 @@ Obain AIRSIS data and create ws_monitor object
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5.000)
diff --git a/docs/reference/airsis_createRawDataframe.html b/docs/reference/airsis_createRawDataframe.html
index 2e63cb44..b2251a26 100644
--- a/docs/reference/airsis_createRawDataframe.html
+++ b/docs/reference/airsis_createRawDataframe.html
@@ -90,7 +90,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_downloadData.html b/docs/reference/airsis_downloadData.html
index 3332975a..a5087fa6 100644
--- a/docs/reference/airsis_downloadData.html
+++ b/docs/reference/airsis_downloadData.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_identifyMonitorType.html b/docs/reference/airsis_identifyMonitorType.html
index 9bddb46c..df5e1a1d 100644
--- a/docs/reference/airsis_identifyMonitorType.html
+++ b/docs/reference/airsis_identifyMonitorType.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_load.html b/docs/reference/airsis_load.html
index ea93b378..fb39457b 100644
--- a/docs/reference/airsis_load.html
+++ b/docs/reference/airsis_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_loadAnnual.html b/docs/reference/airsis_loadAnnual.html
index 2c7ea2bd..76f035af 100644
--- a/docs/reference/airsis_loadAnnual.html
+++ b/docs/reference/airsis_loadAnnual.html
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_loadDaily.html b/docs/reference/airsis_loadDaily.html
index 6fe51b80..44850be3 100644
--- a/docs/reference/airsis_loadDaily.html
+++ b/docs/reference/airsis_loadDaily.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_loadLatest.html b/docs/reference/airsis_loadLatest.html
index ad741749..c7bf7ff8 100644
--- a/docs/reference/airsis_loadLatest.html
+++ b/docs/reference/airsis_loadLatest.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_parseData.html b/docs/reference/airsis_parseData.html
index 33109a71..3720a669 100644
--- a/docs/reference/airsis_parseData.html
+++ b/docs/reference/airsis_parseData.html
@@ -92,7 +92,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/airsis_qualityControl.html b/docs/reference/airsis_qualityControl.html
index 2665f718..abfea934 100644
--- a/docs/reference/airsis_qualityControl.html
+++ b/docs/reference/airsis_qualityControl.html
@@ -64,7 +64,7 @@
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5.000)
@@ -100,7 +100,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -192,7 +192,7 @@ Apply Quality Control to raw AIRSIS dataframe
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5.000)
diff --git a/docs/reference/aqiColors.html b/docs/reference/aqiColors.html
index e2179bd4..5bb76942 100644
--- a/docs/reference/aqiColors.html
+++ b/docs/reference/aqiColors.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/aqiPalette.html b/docs/reference/aqiPalette.html
index d54415ca..8061d10f 100644
--- a/docs/reference/aqiPalette.html
+++ b/docs/reference/aqiPalette.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/createEmptyMetaDataframe.html b/docs/reference/createEmptyMetaDataframe.html
index 85eeeaf4..f8b0bbb9 100644
--- a/docs/reference/createEmptyMetaDataframe.html
+++ b/docs/reference/createEmptyMetaDataframe.html
@@ -92,7 +92,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/createEmptyMonitor.html b/docs/reference/createEmptyMonitor.html
index 23580f6d..fe6d8eb3 100644
--- a/docs/reference/createEmptyMonitor.html
+++ b/docs/reference/createEmptyMonitor.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/distance.html b/docs/reference/distance.html
index 01a45642..99ad9452 100644
--- a/docs/reference/distance.html
+++ b/docs/reference/distance.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/downloadDataFile.html b/docs/reference/downloadDataFile.html
index 421693e6..bcd165ae 100644
--- a/docs/reference/downloadDataFile.html
+++ b/docs/reference/downloadDataFile.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_createDataDataframe.html b/docs/reference/epa_createDataDataframe.html
index 60807d3a..c4eb1d15 100644
--- a/docs/reference/epa_createDataDataframe.html
+++ b/docs/reference/epa_createDataDataframe.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_createMetaDataframe.html b/docs/reference/epa_createMetaDataframe.html
index 13e772fb..5dac2c83 100644
--- a/docs/reference/epa_createMetaDataframe.html
+++ b/docs/reference/epa_createMetaDataframe.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_createMonitorObject.html b/docs/reference/epa_createMonitorObject.html
index 0e68aafd..d30f58c4 100644
--- a/docs/reference/epa_createMonitorObject.html
+++ b/docs/reference/epa_createMonitorObject.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_downloadData.html b/docs/reference/epa_downloadData.html
index 2ecc4d5d..861a1adb 100644
--- a/docs/reference/epa_downloadData.html
+++ b/docs/reference/epa_downloadData.html
@@ -98,7 +98,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_load.html b/docs/reference/epa_load.html
index a9cdb16c..f69fbc2d 100644
--- a/docs/reference/epa_load.html
+++ b/docs/reference/epa_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_loadAnnual.html b/docs/reference/epa_loadAnnual.html
index b1bb3d8c..2a47c1bf 100644
--- a/docs/reference/epa_loadAnnual.html
+++ b/docs/reference/epa_loadAnnual.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/epa_parseData.html b/docs/reference/epa_parseData.html
index f3055e8d..775f2f88 100644
--- a/docs/reference/epa_parseData.html
+++ b/docs/reference/epa_parseData.html
@@ -114,7 +114,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/esriToken.html b/docs/reference/esriToken.html
index 5a9b88d3..e7fa1f45 100644
--- a/docs/reference/esriToken.html
+++ b/docs/reference/esriToken.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/generic_downloadData.html b/docs/reference/generic_downloadData.html
index cba200ff..2da8e8aa 100644
--- a/docs/reference/generic_downloadData.html
+++ b/docs/reference/generic_downloadData.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/generic_parseData.html b/docs/reference/generic_parseData.html
index 7e806a77..34e7b1d8 100644
--- a/docs/reference/generic_parseData.html
+++ b/docs/reference/generic_parseData.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -214,14 +214,14 @@ Examp
configList <- jsonlite::fromJSON(configPath)
fileString <- generic_downloadData(filePath)
-
#> INFO [2021-03-01 15:50:32] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpdwJNBL/temp_libpath27fd49985f4f/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-03-01 15:50:32] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpdwJNBL/temp_libpath27fd49985f4f/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-03-01 15:50:32] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpdwJNBL/temp_libpath27fd49985f4f/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-03-01 15:50:32] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpdwJNBL/temp_libpath27fd49985f4f/PWFSLSmoke/extdata/generic_data_example.csv
parsedData <- generic_parseData(fileString, configList)
+
#> INFO [2021-07-07 11:02:10] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpZekmEO/temp_libpath9654735e5e1f/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-07-07 11:02:10] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpZekmEO/temp_libpath9654735e5e1f/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-07-07 11:02:10] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpZekmEO/temp_libpath9654735e5e1f/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-07-07 11:02:10] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpZekmEO/temp_libpath9654735e5e1f/PWFSLSmoke/extdata/generic_data_example.csv
parsedData <- generic_parseData(fileString, configList)
diff --git a/docs/reference/getGoogleApiKey.html b/docs/reference/getGoogleApiKey.html
index f3b8bc76..130e0b85 100644
--- a/docs/reference/getGoogleApiKey.html
+++ b/docs/reference/getGoogleApiKey.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/googleApiKey.html b/docs/reference/googleApiKey.html
index 8a53e15c..237a49ab 100644
--- a/docs/reference/googleApiKey.html
+++ b/docs/reference/googleApiKey.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/index.html b/docs/reference/index.html
index dc21398a..c459975b 100644
--- a/docs/reference/index.html
+++ b/docs/reference/index.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/initializeMazamaSpatialUtils.html b/docs/reference/initializeMazamaSpatialUtils.html
index 30e1a3ac..1fd6bb45 100644
--- a/docs/reference/initializeMazamaSpatialUtils.html
+++ b/docs/reference/initializeMazamaSpatialUtils.html
@@ -88,7 +88,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/loadDaily.html b/docs/reference/loadDaily.html
index a1eaa3a6..b165a83e 100644
--- a/docs/reference/loadDaily.html
+++ b/docs/reference/loadDaily.html
@@ -92,7 +92,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/loadLatest.html b/docs/reference/loadLatest.html
index 5171e910..62dbbb18 100644
--- a/docs/reference/loadLatest.html
+++ b/docs/reference/loadLatest.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_aqi.html b/docs/reference/monitor_aqi.html
index 2bdd241c..ff3c4721 100644
--- a/docs/reference/monitor_aqi.html
+++ b/docs/reference/monitor_aqi.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_asDataframe.html b/docs/reference/monitor_asDataframe.html
index e74ba76c..1a1db0ef 100644
--- a/docs/reference/monitor_asDataframe.html
+++ b/docs/reference/monitor_asDataframe.html
@@ -98,7 +98,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_collapse.html b/docs/reference/monitor_collapse.html
index 43bcba2c..253a2dbf 100644
--- a/docs/reference/monitor_collapse.html
+++ b/docs/reference/monitor_collapse.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_combine.html b/docs/reference/monitor_combine.html
index 4e2f256d..e8667fba 100644
--- a/docs/reference/monitor_combine.html
+++ b/docs/reference/monitor_combine.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_dailyBarplot.html b/docs/reference/monitor_dailyBarplot.html
index b81e33b0..dc309d00 100644
--- a/docs/reference/monitor_dailyBarplot.html
+++ b/docs/reference/monitor_dailyBarplot.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_dailyStatistic.html b/docs/reference/monitor_dailyStatistic.html
index e5dce6f7..a23053f0 100644
--- a/docs/reference/monitor_dailyStatistic.html
+++ b/docs/reference/monitor_dailyStatistic.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_dailyStatisticList.html b/docs/reference/monitor_dailyStatisticList.html
index 16f7703a..ee818ccd 100644
--- a/docs/reference/monitor_dailyStatisticList.html
+++ b/docs/reference/monitor_dailyStatisticList.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_dailyThreshold.html b/docs/reference/monitor_dailyThreshold.html
index 0844aac2..4d602f10 100644
--- a/docs/reference/monitor_dailyThreshold.html
+++ b/docs/reference/monitor_dailyThreshold.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_distance.html b/docs/reference/monitor_distance.html
index e628f815..2e0bce28 100644
--- a/docs/reference/monitor_distance.html
+++ b/docs/reference/monitor_distance.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_downloadAnnual.html b/docs/reference/monitor_downloadAnnual.html
index 867ba5f8..770df39a 100644
--- a/docs/reference/monitor_downloadAnnual.html
+++ b/docs/reference/monitor_downloadAnnual.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_downloadDaily-1.png b/docs/reference/monitor_downloadDaily-1.png
index a5233951..0755cac8 100644
Binary files a/docs/reference/monitor_downloadDaily-1.png and b/docs/reference/monitor_downloadDaily-1.png differ
diff --git a/docs/reference/monitor_downloadDaily.html b/docs/reference/monitor_downloadDaily.html
index 54e9da04..5437fc97 100644
--- a/docs/reference/monitor_downloadDaily.html
+++ b/docs/reference/monitor_downloadDaily.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_downloadLatest-1.png b/docs/reference/monitor_downloadLatest-1.png
index a5233951..0755cac8 100644
Binary files a/docs/reference/monitor_downloadLatest-1.png and b/docs/reference/monitor_downloadLatest-1.png differ
diff --git a/docs/reference/monitor_downloadLatest.html b/docs/reference/monitor_downloadLatest.html
index 4d16bfde..f45f8dd5 100644
--- a/docs/reference/monitor_downloadLatest.html
+++ b/docs/reference/monitor_downloadLatest.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_dygraph.html b/docs/reference/monitor_dygraph.html
index 86e3dd79..b7b53cde 100644
--- a/docs/reference/monitor_dygraph.html
+++ b/docs/reference/monitor_dygraph.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_extractDataFrame.html b/docs/reference/monitor_extractDataFrame.html
index fd094111..e3dcf56b 100644
--- a/docs/reference/monitor_extractDataFrame.html
+++ b/docs/reference/monitor_extractDataFrame.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_getCurrentStatus.html b/docs/reference/monitor_getCurrentStatus.html
index 7e474bb6..b0ee3fd3 100644
--- a/docs/reference/monitor_getCurrentStatus.html
+++ b/docs/reference/monitor_getCurrentStatus.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_getDailyMean.html b/docs/reference/monitor_getDailyMean.html
index 09fcf8aa..ee536f17 100644
--- a/docs/reference/monitor_getDailyMean.html
+++ b/docs/reference/monitor_getDailyMean.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_hourlyBarplot.html b/docs/reference/monitor_hourlyBarplot.html
index da8b38b4..aebfa273 100644
--- a/docs/reference/monitor_hourlyBarplot.html
+++ b/docs/reference/monitor_hourlyBarplot.html
@@ -88,7 +88,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_isEmpty.html b/docs/reference/monitor_isEmpty.html
index 7457d72b..012e08a7 100644
--- a/docs/reference/monitor_isEmpty.html
+++ b/docs/reference/monitor_isEmpty.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_isMonitor.html b/docs/reference/monitor_isMonitor.html
index 6952801e..6ab6e7fc 100644
--- a/docs/reference/monitor_isMonitor.html
+++ b/docs/reference/monitor_isMonitor.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_isTidy.html b/docs/reference/monitor_isTidy.html
index b3ec9760..91ed1aab 100644
--- a/docs/reference/monitor_isTidy.html
+++ b/docs/reference/monitor_isTidy.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_isolate.html b/docs/reference/monitor_isolate.html
index c705f008..c27f9072 100644
--- a/docs/reference/monitor_isolate.html
+++ b/docs/reference/monitor_isolate.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_join.html b/docs/reference/monitor_join.html
index dcbcf546..05f23de0 100644
--- a/docs/reference/monitor_join.html
+++ b/docs/reference/monitor_join.html
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_leaflet.html b/docs/reference/monitor_leaflet.html
index a7de5e15..f7627870 100644
--- a/docs/reference/monitor_leaflet.html
+++ b/docs/reference/monitor_leaflet.html
@@ -88,7 +88,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_load.html b/docs/reference/monitor_load.html
index 5a196a19..21a245d7 100644
--- a/docs/reference/monitor_load.html
+++ b/docs/reference/monitor_load.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_loadAnnual.html b/docs/reference/monitor_loadAnnual.html
index 33377fb3..8e3f55b1 100644
--- a/docs/reference/monitor_loadAnnual.html
+++ b/docs/reference/monitor_loadAnnual.html
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_loadDaily.html b/docs/reference/monitor_loadDaily.html
index f254278f..56a7202b 100644
--- a/docs/reference/monitor_loadDaily.html
+++ b/docs/reference/monitor_loadDaily.html
@@ -100,7 +100,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_loadLatest.html b/docs/reference/monitor_loadLatest.html
index f21149d0..c0476718 100644
--- a/docs/reference/monitor_loadLatest.html
+++ b/docs/reference/monitor_loadLatest.html
@@ -100,7 +100,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_map.html b/docs/reference/monitor_map.html
index 82ee2683..ca899d49 100644
--- a/docs/reference/monitor_map.html
+++ b/docs/reference/monitor_map.html
@@ -90,7 +90,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_noDataPlot.html b/docs/reference/monitor_noDataPlot.html
index f737ae35..155c9028 100644
--- a/docs/reference/monitor_noDataPlot.html
+++ b/docs/reference/monitor_noDataPlot.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_nowcast.html b/docs/reference/monitor_nowcast.html
index e2f1a899..a3f1197a 100644
--- a/docs/reference/monitor_nowcast.html
+++ b/docs/reference/monitor_nowcast.html
@@ -88,7 +88,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_performance.html b/docs/reference/monitor_performance.html
index 6877a741..9f218f41 100644
--- a/docs/reference/monitor_performance.html
+++ b/docs/reference/monitor_performance.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_performanceMap.html b/docs/reference/monitor_performanceMap.html
index 26f02c7d..20532268 100644
--- a/docs/reference/monitor_performanceMap.html
+++ b/docs/reference/monitor_performanceMap.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_print.html b/docs/reference/monitor_print.html
index 493348b6..759986c7 100644
--- a/docs/reference/monitor_print.html
+++ b/docs/reference/monitor_print.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_reorder.html b/docs/reference/monitor_reorder.html
index b2496d31..3b368fd8 100644
--- a/docs/reference/monitor_reorder.html
+++ b/docs/reference/monitor_reorder.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_replaceData.html b/docs/reference/monitor_replaceData.html
index 4edf76ae..d031a140 100644
--- a/docs/reference/monitor_replaceData.html
+++ b/docs/reference/monitor_replaceData.html
@@ -86,7 +86,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_rollingMean.html b/docs/reference/monitor_rollingMean.html
index 6b417d5d..c9922f30 100644
--- a/docs/reference/monitor_rollingMean.html
+++ b/docs/reference/monitor_rollingMean.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_rollingMeanPlot.html b/docs/reference/monitor_rollingMeanPlot.html
index b0e08ce7..c72b29d7 100644
--- a/docs/reference/monitor_rollingMeanPlot.html
+++ b/docs/reference/monitor_rollingMeanPlot.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_scaleData.html b/docs/reference/monitor_scaleData.html
index 0cca5fe3..68cf3e1f 100644
--- a/docs/reference/monitor_scaleData.html
+++ b/docs/reference/monitor_scaleData.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_stamenmap.html b/docs/reference/monitor_stamenmap.html
index 9451c1a4..cc1d7243 100644
--- a/docs/reference/monitor_stamenmap.html
+++ b/docs/reference/monitor_stamenmap.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_staticmap.html b/docs/reference/monitor_staticmap.html
index ab438e97..1516bc46 100644
--- a/docs/reference/monitor_staticmap.html
+++ b/docs/reference/monitor_staticmap.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_subset.html b/docs/reference/monitor_subset.html
index 43c17917..27607e78 100644
--- a/docs/reference/monitor_subset.html
+++ b/docs/reference/monitor_subset.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_subsetBy.html b/docs/reference/monitor_subsetBy.html
index e5fafe77..6b094c55 100644
--- a/docs/reference/monitor_subsetBy.html
+++ b/docs/reference/monitor_subsetBy.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_subsetByDistance.html b/docs/reference/monitor_subsetByDistance.html
index 81bf688c..579cb4c0 100644
--- a/docs/reference/monitor_subsetByDistance.html
+++ b/docs/reference/monitor_subsetByDistance.html
@@ -86,7 +86,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_subsetData.html b/docs/reference/monitor_subsetData.html
index fcc0182b..78d135c8 100644
--- a/docs/reference/monitor_subsetData.html
+++ b/docs/reference/monitor_subsetData.html
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_subsetMeta.html b/docs/reference/monitor_subsetMeta.html
index ba5ae1bc..f40160f0 100644
--- a/docs/reference/monitor_subsetMeta.html
+++ b/docs/reference/monitor_subsetMeta.html
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_timeAverage.html b/docs/reference/monitor_timeAverage.html
index 513c3d07..6033a7c8 100644
--- a/docs/reference/monitor_timeAverage.html
+++ b/docs/reference/monitor_timeAverage.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_timeInfo.html b/docs/reference/monitor_timeInfo.html
index 979a5ddc..e1f50998 100644
--- a/docs/reference/monitor_timeInfo.html
+++ b/docs/reference/monitor_timeInfo.html
@@ -95,7 +95,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_timeseriesPlot.html b/docs/reference/monitor_timeseriesPlot.html
index 5be9630c..1a3b9938 100644
--- a/docs/reference/monitor_timeseriesPlot.html
+++ b/docs/reference/monitor_timeseriesPlot.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_toTidy.html b/docs/reference/monitor_toTidy.html
index 2d0040e0..d59ca779 100644
--- a/docs/reference/monitor_toTidy.html
+++ b/docs/reference/monitor_toTidy.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_trim.html b/docs/reference/monitor_trim.html
index 19886b4f..e6df99fc 100644
--- a/docs/reference/monitor_trim.html
+++ b/docs/reference/monitor_trim.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_writeCSV.html b/docs/reference/monitor_writeCSV.html
index bd9e2038..2e35b7b8 100644
--- a/docs/reference/monitor_writeCSV.html
+++ b/docs/reference/monitor_writeCSV.html
@@ -88,7 +88,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/monitor_writeCurrentStatusGeoJSON-1.png b/docs/reference/monitor_writeCurrentStatusGeoJSON-1.png
index 2ecea767..649ff6b3 100644
Binary files a/docs/reference/monitor_writeCurrentStatusGeoJSON-1.png and b/docs/reference/monitor_writeCurrentStatusGeoJSON-1.png differ
diff --git a/docs/reference/monitor_writeCurrentStatusGeoJSON.html b/docs/reference/monitor_writeCurrentStatusGeoJSON.html
index 43fe4e4b..95d9b771 100644
--- a/docs/reference/monitor_writeCurrentStatusGeoJSON.html
+++ b/docs/reference/monitor_writeCurrentStatusGeoJSON.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -225,8 +225,8 @@ Examp
#> Warning: Discarded datum Unknown based on WGS84 ellipsoid in CRS definition
#> OGR data source with driver: GeoJSON
-#> Source: "/private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/Rtmp2oyOCR/file283d23135f83.geojson", layer: "currentTbl"
-#> with 67 features
+#> Source: "/private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpqRp1ja/file968d6fcfb394.geojson", layer: "currentTbl"
+#> with 69 features
#> It has 45 fields
map("state", "washington")
diff --git a/docs/reference/rawPlot_pollutionRose.html b/docs/reference/rawPlot_pollutionRose.html
index 0cf70546..30ca36d5 100644
--- a/docs/reference/rawPlot_pollutionRose.html
+++ b/docs/reference/rawPlot_pollutionRose.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/rawPlot_timeOfDaySpaghetti.html b/docs/reference/rawPlot_timeOfDaySpaghetti.html
index 55892568..afbe6f99 100644
--- a/docs/reference/rawPlot_timeOfDaySpaghetti.html
+++ b/docs/reference/rawPlot_timeOfDaySpaghetti.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/rawPlot_timeseries.html b/docs/reference/rawPlot_timeseries.html
index d7306c7a..380b17d5 100644
--- a/docs/reference/rawPlot_timeseries.html
+++ b/docs/reference/rawPlot_timeseries.html
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/rawPlot_windRose.html b/docs/reference/rawPlot_windRose.html
index f83bce88..ce9c40e3 100644
--- a/docs/reference/rawPlot_windRose.html
+++ b/docs/reference/rawPlot_windRose.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/raw_enhance.html b/docs/reference/raw_enhance.html
index e81229eb..d7b222c6 100644
--- a/docs/reference/raw_enhance.html
+++ b/docs/reference/raw_enhance.html
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/raw_getHighlightDates.html b/docs/reference/raw_getHighlightDates.html
index d48b1988..69441646 100644
--- a/docs/reference/raw_getHighlightDates.html
+++ b/docs/reference/raw_getHighlightDates.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/setEsriToken.html b/docs/reference/setEsriToken.html
index bd424237..2ebb41a6 100644
--- a/docs/reference/setEsriToken.html
+++ b/docs/reference/setEsriToken.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/setGoogleApiKey.html b/docs/reference/setGoogleApiKey.html
index bb2f71ad..fed86b9d 100644
--- a/docs/reference/setGoogleApiKey.html
+++ b/docs/reference/setGoogleApiKey.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/skill_ROC.html b/docs/reference/skill_ROC.html
index 71f52ac0..7e42cc89 100644
--- a/docs/reference/skill_ROC.html
+++ b/docs/reference/skill_ROC.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/skill_ROCPlot.html b/docs/reference/skill_ROCPlot.html
index 69557121..a4b949d1 100644
--- a/docs/reference/skill_ROCPlot.html
+++ b/docs/reference/skill_ROCPlot.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/skill_confusionMatrix.html b/docs/reference/skill_confusionMatrix.html
index 406c696a..2ed877a7 100644
--- a/docs/reference/skill_confusionMatrix.html
+++ b/docs/reference/skill_confusionMatrix.html
@@ -113,7 +113,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/staticmap_getEsrimapBrick.html b/docs/reference/staticmap_getEsrimapBrick.html
index a108be68..00383d8c 100644
--- a/docs/reference/staticmap_getEsrimapBrick.html
+++ b/docs/reference/staticmap_getEsrimapBrick.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/staticmap_getRasterBrick.html b/docs/reference/staticmap_getRasterBrick.html
index 29e11dba..4bb5de13 100644
--- a/docs/reference/staticmap_getRasterBrick.html
+++ b/docs/reference/staticmap_getRasterBrick.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/staticmap_getStamenmapBrick.html b/docs/reference/staticmap_getStamenmapBrick.html
index 74e24b87..d883cdbc 100644
--- a/docs/reference/staticmap_getStamenmapBrick.html
+++ b/docs/reference/staticmap_getStamenmapBrick.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/staticmap_plotRasterBrick.html b/docs/reference/staticmap_plotRasterBrick.html
index 8607aae1..a6a2f491 100644
--- a/docs/reference/staticmap_plotRasterBrick.html
+++ b/docs/reference/staticmap_plotRasterBrick.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/tidy_toMonitor.html b/docs/reference/tidy_toMonitor.html
index 2560945c..975950f9 100644
--- a/docs/reference/tidy_toMonitor.html
+++ b/docs/reference/tidy_toMonitor.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/timeInfo.html b/docs/reference/timeInfo.html
index 56de850e..ff7b83ee 100644
--- a/docs/reference/timeInfo.html
+++ b/docs/reference/timeInfo.html
@@ -98,7 +98,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/upgradeMeta_v1.0.html b/docs/reference/upgradeMeta_v1.0.html
index 966b1eb8..c0d57c53 100644
--- a/docs/reference/upgradeMeta_v1.0.html
+++ b/docs/reference/upgradeMeta_v1.0.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_EBAMQualityControl.html b/docs/reference/wrcc_EBAMQualityControl.html
index 469df9d2..4b6e3e14 100644
--- a/docs/reference/wrcc_EBAMQualityControl.html
+++ b/docs/reference/wrcc_EBAMQualityControl.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -193,7 +193,7 @@ Apply Quality Control to raw WRCC EBAM tibble
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5000),
flagAndKeep = FALSE
)
diff --git a/docs/reference/wrcc_ESAMQualityControl.html b/docs/reference/wrcc_ESAMQualityControl.html
index 8947266c..38ecee00 100644
--- a/docs/reference/wrcc_ESAMQualityControl.html
+++ b/docs/reference/wrcc_ESAMQualityControl.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_createDataDataframe.html b/docs/reference/wrcc_createDataDataframe.html
index 77a4d832..952efaa5 100644
--- a/docs/reference/wrcc_createDataDataframe.html
+++ b/docs/reference/wrcc_createDataDataframe.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_createMetaDataframe.html b/docs/reference/wrcc_createMetaDataframe.html
index 84d3f1c1..0a2be1c5 100644
--- a/docs/reference/wrcc_createMetaDataframe.html
+++ b/docs/reference/wrcc_createMetaDataframe.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_createMonitorObject.html b/docs/reference/wrcc_createMonitorObject.html
index 5921cfdd..52ef1d60 100644
--- a/docs/reference/wrcc_createMonitorObject.html
+++ b/docs/reference/wrcc_createMonitorObject.html
@@ -69,7 +69,7 @@
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5000)
@@ -105,7 +105,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
@@ -202,7 +202,7 @@ Obtain WRCC data and create ws_monitor object
remove_Lat_zero = TRUE
valid_Flow = c(16.7*0.95,16.7*1.05)
valid_AT = c(-Inf,45)
-valid_RHi = c(-Inf,45)
+valid_RHi = c(-Inf,50)
valid_Conc = c(-Inf,5000)
@@ -293,11 +293,11 @@ Examp
initializeMazamaSpatialUtils()
sm13 <- wrcc_createMonitorObject(20150301, 20150831, unitID = 'sm13')
-
#> WARN [2021-03-01 15:52:21] More than one monitor type detected: 9, 0
-#> WARN [2021-03-01 15:52:21] More than one monitor type detected: 9, 0
-#> WARN [2021-03-01 15:52:21] More than one monitor type detected: 9, 0
-#> WARN [2021-03-01 15:52:21] More than one monitor type detected: 9, 0
-#> WARN [2021-03-01 15:52:21] More than one monitor type detected: 9, 0
#> WARN [2021-07-07 11:03:02] More than one monitor type detected: 9, 0
+#> WARN [2021-07-07 11:03:02] More than one monitor type detected: 9, 0
+#> WARN [2021-07-07 11:03:02] More than one monitor type detected: 9, 0
+#> WARN [2021-07-07 11:03:02] More than one monitor type detected: 9, 0
+#> WARN [2021-07-07 11:03:02] More than one monitor type detected: 9, 0
diff --git a/docs/reference/wrcc_createRawDataframe.html b/docs/reference/wrcc_createRawDataframe.html
index 2ba8ae17..5a3af705 100644
--- a/docs/reference/wrcc_createRawDataframe.html
+++ b/docs/reference/wrcc_createRawDataframe.html
@@ -90,7 +90,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_downloadData.html b/docs/reference/wrcc_downloadData.html
index 4030b23c..d9d40513 100644
--- a/docs/reference/wrcc_downloadData.html
+++ b/docs/reference/wrcc_downloadData.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_identifyMonitorType.html b/docs/reference/wrcc_identifyMonitorType.html
index 64f18640..5793c334 100644
--- a/docs/reference/wrcc_identifyMonitorType.html
+++ b/docs/reference/wrcc_identifyMonitorType.html
@@ -95,7 +95,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_load.html b/docs/reference/wrcc_load.html
index 5697b2f9..1cc01ef3 100644
--- a/docs/reference/wrcc_load.html
+++ b/docs/reference/wrcc_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_loadAnnual.html b/docs/reference/wrcc_loadAnnual.html
index c2eb8a05..f2a6cc6f 100644
--- a/docs/reference/wrcc_loadAnnual.html
+++ b/docs/reference/wrcc_loadAnnual.html
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_loadDaily.html b/docs/reference/wrcc_loadDaily.html
index d1f808ce..85245220 100644
--- a/docs/reference/wrcc_loadDaily.html
+++ b/docs/reference/wrcc_loadDaily.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_loadLatest.html b/docs/reference/wrcc_loadLatest.html
index 3dc74400..405f9b4c 100644
--- a/docs/reference/wrcc_loadLatest.html
+++ b/docs/reference/wrcc_loadLatest.html
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_parseData.html b/docs/reference/wrcc_parseData.html
index afd11d3a..ad08f374 100644
--- a/docs/reference/wrcc_parseData.html
+++ b/docs/reference/wrcc_parseData.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/docs/reference/wrcc_qualityControl.html b/docs/reference/wrcc_qualityControl.html
index 01d997ec..0a0abcd5 100644
--- a/docs/reference/wrcc_qualityControl.html
+++ b/docs/reference/wrcc_qualityControl.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.113
+ 1.2.114
diff --git a/man/airsis_EBAMQualityControl.Rd b/man/airsis_EBAMQualityControl.Rd
index 971f7096..87799f82 100644
--- a/man/airsis_EBAMQualityControl.Rd
+++ b/man/airsis_EBAMQualityControl.Rd
@@ -12,7 +12,7 @@ airsis_EBAMQualityControl(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/man/airsis_EBAM_MULTI2QualityControl.Rd b/man/airsis_EBAM_MULTI2QualityControl.Rd
index 8ce5da23..e385575e 100644
--- a/man/airsis_EBAM_MULTI2QualityControl.Rd
+++ b/man/airsis_EBAM_MULTI2QualityControl.Rd
@@ -12,7 +12,7 @@ airsis_EBAM_MULTI2QualityControl(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/man/airsis_EBAM_PLUS_MULTIQualityControl.Rd b/man/airsis_EBAM_PLUS_MULTIQualityControl.Rd
index fd8bc5a9..2de2501a 100644
--- a/man/airsis_EBAM_PLUS_MULTIQualityControl.Rd
+++ b/man/airsis_EBAM_PLUS_MULTIQualityControl.Rd
@@ -12,7 +12,7 @@ airsis_EBAM_PLUS_MULTIQualityControl(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5),
flagAndKeep = FALSE
)
diff --git a/man/airsis_createMonitorObject.Rd b/man/airsis_createMonitorObject.Rd
index 7c47edf2..fec3370d 100644
--- a/man/airsis_createMonitorObject.Rd
+++ b/man/airsis_createMonitorObject.Rd
@@ -73,7 +73,7 @@ valid data ranges as taken from \code{airsis_EBAMQualityControl()}:
\item{\code{remove_Lat_zero = TRUE}}
\item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
\item{\code{valid_AT = c(-Inf,45)}}
-\item{\code{valid_RHi = c(-Inf,45)}}
+\item{\code{valid_RHi = c(-Inf,50)}}
\item{\code{valid_Conc = c(-Inf,5.000)}}
}
diff --git a/man/airsis_qualityControl.Rd b/man/airsis_qualityControl.Rd
index 42baa90b..864d4a1b 100644
--- a/man/airsis_qualityControl.Rd
+++ b/man/airsis_qualityControl.Rd
@@ -35,7 +35,7 @@ valid data ranges as taken from \code{airsis_EBAMQualityControl()}:
\item{\code{remove_Lat_zero = TRUE}}
\item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
\item{\code{valid_AT = c(-Inf,45)}}
-\item{\code{valid_RHi = c(-Inf,45)}}
+\item{\code{valid_RHi = c(-Inf,50)}}
\item{\code{valid_Conc = c(-Inf,5.000)}}
}
diff --git a/man/wrcc_EBAMQualityControl.Rd b/man/wrcc_EBAMQualityControl.Rd
index 0a678416..26172244 100644
--- a/man/wrcc_EBAMQualityControl.Rd
+++ b/man/wrcc_EBAMQualityControl.Rd
@@ -12,7 +12,7 @@ wrcc_EBAMQualityControl(
remove_Lat_zero = TRUE,
valid_Flow = c(16.7 * 0.95, 16.7 * 1.05),
valid_AT = c(-Inf, 45),
- valid_RHi = c(-Inf, 45),
+ valid_RHi = c(-Inf, 50),
valid_Conc = c(-Inf, 5000),
flagAndKeep = FALSE
)
diff --git a/man/wrcc_createMonitorObject.Rd b/man/wrcc_createMonitorObject.Rd
index dc854fc2..45ec54e3 100644
--- a/man/wrcc_createMonitorObject.Rd
+++ b/man/wrcc_createMonitorObject.Rd
@@ -70,7 +70,7 @@ valid data ranges as taken from \code{wrcc_EBAMQualityControl()}:
\item{\code{remove_Lat_zero = TRUE}}
\item{\code{valid_Flow = c(16.7*0.95,16.7*1.05)}}
\item{\code{valid_AT = c(-Inf,45)}}
-\item{\code{valid_RHi = c(-Inf,45)}}
+\item{\code{valid_RHi = c(-Inf,50)}}
\item{\code{valid_Conc = c(-Inf,5000)}}
}