diff --git a/DESCRIPTION b/DESCRIPTION
index b4bb3020..222cb628 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -64,10 +64,10 @@ Description: Utilities for working with air quality monitoring data
the United States 'EPA' and
it's 'AirNow' air quality site .
Additional sources of PM2.5 data made accessible by the package include:
- 'AIRSIS' (password protected)
+ 'AIRSIS' (aka "Oceaneering", not public)
and 'WRCC' .
- Data compilations are provided by 'PWFSL'
- .
+ Data compilations are hosted by the USFS 'AirFire' research team
+ .
License: GPL-3
VignetteBuilder: knitr
Repository: CRAN
diff --git a/NEWS.md b/NEWS.md
index 2840e477..b004f199 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -2,6 +2,7 @@
Documentation and other fixes to deal with CRAN check issues.
+* Updated various URLs in function documentation.
* Put all internet connected examples inside a `try({ ... })` block to fail
gracefully when resources are not available.
* Updated many examples to use the `Camp_Fire` dataset.
diff --git a/R/PWFSLSmoke-deprecated.R b/R/PWFSLSmoke-deprecated.R
index d36cee48..63d518d5 100644
--- a/R/PWFSLSmoke-deprecated.R
+++ b/R/PWFSLSmoke-deprecated.R
@@ -51,57 +51,57 @@ NULL
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorGoogleMap <- function(ws_monitor,
- slice = get("max"),
- breaks = AQI$breaks_24,
- colors = AQI$colors,
- width = 640,
- height = 640,
- centerLon = NULL,
- centerLat = NULL,
- zoom = NULL,
- maptype = "roadmap",
- grayscale = FALSE,
- map = NULL,
- ...) {
-
+monitorGoogleMap <- function(
+ ws_monitor,
+ slice = get("max"),
+ breaks = AQI$breaks_24,
+ colors = AQI$colors,
+ width = 640,
+ height = 640,
+ centerLon = NULL,
+ centerLat = NULL,
+ zoom = NULL,
+ maptype = "roadmap",
+ grayscale = FALSE,
+ map = NULL,
+ ...
+) {
.Defunct("monitor_esriMap", package = "PWFSLSmoke")
-
}
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorEsriMap <- function(ws_monitor,
- slice = get("max"),
- breaks = AQI$breaks_24,
- colors = AQI$colors,
- width = 640,
- height = 640,
- centerLon = NULL,
- centerLat = NULL,
- zoom = NULL,
- maptype = "roadmap",
- grayscale = FALSE,
- map = NULL,
- ...) {
-
+monitorEsriMap <- function(
+ ws_monitor,
+ slice = get("max"),
+ breaks = AQI$breaks_24,
+ colors = AQI$colors,
+ width = 640,
+ height = 640,
+ centerLon = NULL,
+ centerLat = NULL,
+ zoom = NULL,
+ maptype = "roadmap",
+ grayscale = FALSE,
+ map = NULL,
+ ...
+) {
.Defunct("monitor_staticmap", package = "PWFSLSmoke")
-
}
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorPlot_timeOfDaySpaghetti <- function(ws_monitor,
- monitorID=NULL,
- tlim=NULL,
- ylim=NULL,
- aqiLines=TRUE,
- shadedNight=TRUE,
- title=NULL,
- ...) {
-
+monitorPlot_timeOfDaySpaghetti <- function(
+ ws_monitor,
+ monitorID=NULL,
+ tlim=NULL,
+ ylim=NULL,
+ aqiLines=TRUE,
+ shadedNight=TRUE,
+ title=NULL,
+ ...
+) {
.Defunct(NULL, package = "PWFSLSmoke")
-
}
@@ -114,34 +114,36 @@ monitorPlot_timeOfDaySpaghetti <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorDygraph <- function(ws_monitor,
- title = "title",
- ylab = "PM2.5 Concentration",
- tlim = NULL,
- rollPeriod = 1,
- showLegend = TRUE) {
-
+monitorDygraph <- function(
+ ws_monitor,
+ title = "title",
+ ylab = "PM2.5 Concentration",
+ tlim = NULL,
+ rollPeriod = 1,
+ showLegend = TRUE
+) {
monitor_dygraph(ws_monitor, title, ylab, tlim, rollPeriod, showLegend)
}
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitor_esriMap <- function(ws_monitor,
- slice = get("max"),
- breaks = AQI$breaks_24,
- colors = AQI$colors,
- width = 640,
- height = 640,
- centerLon = NULL,
- centerLat = NULL,
- zoom = NULL,
- maptype = "worldStreetMap",
- grayscale = FALSE,
- mapRaster = NULL,
- cex = par("cex") * 2.0,
- pch = 16,
- ...) {
-
+monitor_esriMap <- function(
+ ws_monitor,
+ slice = get("max"),
+ breaks = AQI$breaks_24,
+ colors = AQI$colors,
+ width = 640,
+ height = 640,
+ centerLon = NULL,
+ centerLat = NULL,
+ zoom = NULL,
+ maptype = "worldStreetMap",
+ grayscale = FALSE,
+ mapRaster = NULL,
+ cex = par("cex") * 2.0,
+ pch = 16,
+ ...
+) {
monitor_staticmap(
ws_monitor, slice, breaks, colors, width, height,
centerLon, centerLat, zoom, maptype = "world_topo", grayscale, mapRaster,
@@ -151,17 +153,18 @@ monitor_esriMap <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorLeaflet <- function(ws_monitor,
- slice = get("max"),
- breaks = AQI$breaks_24,
- colors = AQI$colors,
- labels = AQI$names,
- legendTitle = "Max AQI Level",
- radius = 10,
- opacity = 0.7,
- maptype = "terrain",
- popupInfo = c("siteName", "monitorID", "elevation")) {
-
+monitorLeaflet <- function(
+ ws_monitor,
+ slice = get("max"),
+ breaks = AQI$breaks_24,
+ colors = AQI$colors,
+ labels = AQI$names,
+ legendTitle = "Max AQI Level",
+ radius = 10,
+ opacity = 0.7,
+ maptype = "terrain",
+ popupInfo = c("siteName", "monitorID", "elevation")
+) {
monitor_leaflet(
ws_monitor, slice, breaks, colors, labels, legendTitle,
radius, opacity, maptype, popupInfo
@@ -170,19 +173,20 @@ monitorLeaflet <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorMap <- function(ws_monitor,
- slice = get("max"),
- breaks = AQI$breaks_24,
- colors = AQI$colors,
- pch = par("pch"),
- cex = par("cex"),
- stateCol = "grey60",
- stateLwd = 2,
- countyCol = "grey70",
- countyLwd = 1,
- add = FALSE,
- ...) {
-
+monitorMap <- function(
+ ws_monitor,
+ slice = get("max"),
+ breaks = AQI$breaks_24,
+ colors = AQI$colors,
+ pch = par("pch"),
+ cex = par("cex"),
+ stateCol = "grey60",
+ stateLwd = 2,
+ countyCol = "grey70",
+ countyLwd = 1,
+ add = FALSE,
+ ...
+) {
monitor_map(
ws_monitor, slice, breaks, colors, pch, cex,
stateCol, stateLwd, countyCol, countyLwd, add,
@@ -192,27 +196,28 @@ monitorMap <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorMap_performance <- function(predicted,
- observed,
- threshold = AQI$breaks_24[3],
- cex = par("cex"),
- sizeBy = NULL,
- colorBy = "heidikeSkill",
- breaks = c(-Inf, .5, .6, .7, .8, Inf),
- paletteFunc = grDevices::colorRampPalette(
- RColorBrewer::brewer.pal(
- length(breaks), "Purples"
- )[-1]
- ),
- showLegend = TRUE,
- legendPos = "topright",
- stateCol = "grey60",
- stateLwd = 2,
- countyCol = "grey70",
- countyLwd = 1,
- add = FALSE,
- ...) {
-
+monitorMap_performance <- function(
+ predicted,
+ observed,
+ threshold = AQI$breaks_24[3],
+ cex = par("cex"),
+ sizeBy = NULL,
+ colorBy = "heidikeSkill",
+ breaks = c(-Inf, .5, .6, .7, .8, Inf),
+ paletteFunc = grDevices::colorRampPalette(
+ RColorBrewer::brewer.pal(
+ length(breaks), "Purples"
+ )[-1]
+ ),
+ showLegend = TRUE,
+ legendPos = "topright",
+ stateCol = "grey60",
+ stateLwd = 2,
+ countyCol = "grey70",
+ countyLwd = 1,
+ add = FALSE,
+ ...
+) {
monitor_performanceMap(
predicted, observed, threshold, cex, sizeBy, colorBy, breaks,
paletteFunc, showLegend, legendPos, stateCol, stateLwd,
@@ -223,18 +228,19 @@ monitorMap_performance <- function(predicted,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorPlot_dailyBarplot <- function(ws_monitor,
- monitorID=NULL,
- tlim=NULL,
- minHours=18,
- gridPos='',
- gridCol='black',
- gridLwd=0.5,
- gridLty='solid',
- labels_x_nudge=0,
- labels_y_nudge=0,
- ...) {
-
+monitorPlot_dailyBarplot <- function(
+ ws_monitor,
+ monitorID=NULL,
+ tlim=NULL,
+ minHours=18,
+ gridPos='',
+ gridCol='black',
+ gridLwd=0.5,
+ gridLty='solid',
+ labels_x_nudge=0,
+ labels_y_nudge=0,
+ ...
+) {
monitor_dailyBarplot(
ws_monitor, monitorID, tlim, minHours,
gridPos, gridCol, gridLwd, gridLty,
@@ -245,27 +251,28 @@ monitorPlot_dailyBarplot <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorPlot_hourlyBarplot <- function(ws_monitor,
- monitorID = NULL,
- tlim = NULL,
- localTime = TRUE,
- style = 'AQI',
- shadedNight = TRUE,
- gridPos = '',
- gridCol = 'black',
- gridLwd = 0.5,
- gridLty = 'solid',
- labels_x_nudge = 0,
- labels_y_nudge = 0,
- dayCol = 'black',
- dayLwd = 2,
- dayLty = 'solid',
- hourCol = 'black',
- hourLwd = 1,
- hourLty = 'solid',
- hourInterval = 6,
- ...) {
-
+monitorPlot_hourlyBarplot <- function(
+ ws_monitor,
+ monitorID = NULL,
+ tlim = NULL,
+ localTime = TRUE,
+ style = 'AQI',
+ shadedNight = TRUE,
+ gridPos = '',
+ gridCol = 'black',
+ gridLwd = 0.5,
+ gridLty = 'solid',
+ labels_x_nudge = 0,
+ labels_y_nudge = 0,
+ dayCol = 'black',
+ dayLwd = 2,
+ dayLty = 'solid',
+ hourCol = 'black',
+ hourLwd = 1,
+ hourLty = 'solid',
+ hourInterval = 6,
+ ...
+) {
monitor_hourlyBarplot(
ws_monitor, monitorID, tlim, localTime, style, shadedNight,
gridPos, gridCol, gridLwd, gridLty, labels_x_nudge, labels_y_nudge,
@@ -277,27 +284,27 @@ monitorPlot_hourlyBarplot <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
monitorPlot_noData <- function(ws_monitor, monitorID=NULL, cex=2.5) {
-
monitor_noDataPlot(ws_monitor, monitorID, cex)
}
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorPlot_rollingMean <- function(ws_monitor,
- monitorID=NULL,
- width=3,
- align="center",
- data.thresh=75,
- tlim=NULL,
- ylim=NULL,
- localTime=TRUE,
- shadedNight=FALSE,
- aqiLines=TRUE,
- gridHorizontal=FALSE,
- grid24hr=FALSE,
- grid3hr=FALSE,
- showLegend=TRUE) {
-
+monitorPlot_rollingMean <- function(
+ ws_monitor,
+ monitorID=NULL,
+ width=3,
+ align="center",
+ data.thresh=75,
+ tlim=NULL,
+ ylim=NULL,
+ localTime=TRUE,
+ shadedNight=FALSE,
+ aqiLines=TRUE,
+ gridHorizontal=FALSE,
+ grid24hr=FALSE,
+ grid3hr=FALSE,
+ showLegend=TRUE
+) {
monitor_rollingMeanPlot(
ws_monitor, monitorID, width, align, data.thresh, tlim, ylim, localTime,
shadedNight, aqiLines, gridHorizontal, grid24hr, grid3hr, showLegend
@@ -306,22 +313,23 @@ monitorPlot_rollingMean <- function(ws_monitor,
#' @export
#' @rdname PWFSLSmoke-deprecated
-monitorPlot_timeseries <- function(ws_monitor,
- monitorID=NULL,
- tlim=NULL,
- localTime=TRUE,
- style=NULL,
- shadedNight=FALSE,
- add=FALSE,
- gridPos='',
- gridCol='black',
- gridLwd=1,
- gridLty='solid',
- dayLwd=0,
- hourLwd=0,
- hourInterval=6,
- ...) {
-
+monitorPlot_timeseries <- function(
+ ws_monitor,
+ monitorID=NULL,
+ tlim=NULL,
+ localTime=TRUE,
+ style=NULL,
+ shadedNight=FALSE,
+ add=FALSE,
+ gridPos='',
+ gridCol='black',
+ gridLwd=1,
+ gridLty='solid',
+ dayLwd=0,
+ hourLwd=0,
+ hourInterval=6,
+ ...
+) {
monitor_timeseriesPlot(
ws_monitor, monitorID, tlim, localTime, style, shadedNight, add,
gridPos, gridCol, gridLwd, gridLty, dayLwd, hourLwd, hourInterval, ...
diff --git a/R/addGoogleAddress.R b/R/addGoogleAddress.R
index 67baf7ef..b924302a 100644
--- a/R/addGoogleAddress.R
+++ b/R/addGoogleAddress.R
@@ -14,7 +14,7 @@
#'
#' Address information is obtained by using the \pkg{ggmap} package.
#' @return Input dataframe with additional columns: \code{siteName, countyName}.
-#' @references \url{https://developers.google.com/maps/documentation/geocoding/intro}
+#' @references \url{https://developers.google.com/maps/documentation/geocoding/overview}
addGoogleAddress <- function(
df,
diff --git a/R/addGoogleElevation.R b/R/addGoogleElevation.R
index ab8a2770..5b500b4b 100644
--- a/R/addGoogleElevation.R
+++ b/R/addGoogleElevation.R
@@ -12,7 +12,7 @@
#'
#' Address information is obtained by using the \pkg{ggmap} package.
#' @return Input dataframe with (possibly) additional column: \code{elevation}.
-#' @references \url{https://developers.google.com/maps/documentation/elevation/intro}
+#' @references \url{https://developers.google.com/maps/documentation/elevation/overview}
addGoogleElevation <- function(
df,
diff --git a/R/airnow_loadAnnual.R b/R/airnow_loadAnnual.R
index b4ef8101..43eddeeb 100644
--- a/R/airnow_loadAnnual.R
+++ b/R/airnow_loadAnnual.R
@@ -47,7 +47,7 @@
#' }
#'
#' Available AirNow RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AirNow/RData}{https://haze.airfire.org/monitoring/AirNow/RData}
+#' \href{https://haze.airfire.org/monitoring/AirNow/RData/}{https://haze.airfire.org/monitoring/AirNow/RData/}
#' @seealso \code{\link{airnow_loadDaily}}
#' @seealso \code{\link{airnow_loadLatest}}
#' @examples
diff --git a/R/airnow_loadDaily.R b/R/airnow_loadDaily.R
index a9303e8e..19f48fab 100644
--- a/R/airnow_loadDaily.R
+++ b/R/airnow_loadDaily.R
@@ -45,7 +45,7 @@
#' }
#'
#' Available AirNow RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AirNow/RData/latest}{https://haze.airfire.org/monitoring/AirNow/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/AirNow/RData/latest/}{https://haze.airfire.org/monitoring/AirNow/RData/latest/}
#' @seealso \code{\link{airnow_loadAnnual}}
#' @seealso \code{\link{airnow_loadLatest}}
#' @examples
diff --git a/R/airnow_loadLatest.R b/R/airnow_loadLatest.R
index f4078a8d..28506b9e 100644
--- a/R/airnow_loadLatest.R
+++ b/R/airnow_loadLatest.R
@@ -45,7 +45,7 @@
#' }
#'
#' Avaialble RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AirNow/RData/latest}{https://haze.airfire.org/monitoring/AirNow/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/AirNow/RData/latest/}{https://haze.airfire.org/monitoring/AirNow/RData/latest/}
#' @seealso \code{\link{airnow_loadAnnual}}
#' @seealso \code{\link{airnow_loadDaily}}
#' @examples
diff --git a/R/airsis_loadAnnual.R b/R/airsis_loadAnnual.R
index a209dcb6..c91a4830 100644
--- a/R/airsis_loadAnnual.R
+++ b/R/airsis_loadAnnual.R
@@ -47,7 +47,7 @@
#' }
#'
#' Available AIRSIS RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData}{https://haze.airfire.org/monitoring/AIRSIS/RData}
+#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData/}{https://haze.airfire.org/monitoring/AIRSIS/RData/}
#' @seealso \code{\link{airsis_loadDaily}}
#' @seealso \code{\link{airsis_loadLatest}}
#' @examples
diff --git a/R/airsis_loadDaily.R b/R/airsis_loadDaily.R
index 789b0a71..f1008bc1 100644
--- a/R/airsis_loadDaily.R
+++ b/R/airsis_loadDaily.R
@@ -45,7 +45,7 @@
#' }
#'
#' Avaialble AIRSIS RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData/latest}{https://haze.airfire.org/monitoring/AIRSIS/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData/latest/}{https://haze.airfire.org/monitoring/AIRSIS/RData/latest/}
#' @seealso \code{\link{airsis_loadAnnual}}
#' @seealso \code{\link{airsis_loadLatest}}
#' @examples
diff --git a/R/airsis_loadLatest.R b/R/airsis_loadLatest.R
index 5638365c..328e24ce 100644
--- a/R/airsis_loadLatest.R
+++ b/R/airsis_loadLatest.R
@@ -45,7 +45,7 @@
#' }
#'
#' Avaialble RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData/latest}{https://haze.airfire.org/monitoring/AIRSIS/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/AIRSIS/RData/latest/}{https://haze.airfire.org/monitoring/AIRSIS/RData/latest/}
#' @seealso \code{\link{airsis_loadAnnual}}
#' @seealso \code{\link{airsis_loadDaily}}
#' @examples
diff --git a/R/monitor_nowcast.R b/R/monitor_nowcast.R
index 986f821d..58900a62 100644
--- a/R/monitor_nowcast.R
+++ b/R/monitor_nowcast.R
@@ -32,9 +32,7 @@
#' .001 ppm for 'ozone' regardless of the precision of the data in the incoming \emph{ws_monitor} object.
#'
#' @references \url{https://en.wikipedia.org/wiki/Nowcast_(Air_Quality_Index)}
-#' @references \url{https://www3.epa.gov/airnow/ani/pm25_aqi_reporting_nowcast_overview.pdf}
#' @references \url{https://aqicn.org/faq/2015-03-15/air-quality-nowcast-a-beginners-guide/}
-#' @references \url{https://airnow.zendesk.com/hc/en-us/articles/211625598-How-does-AirNow-make-the-Current-PM-Air-Quality-Index-AQI-maps-}
#' @references https://forum.airnowtech.org/t/the-nowcast-for-ozone-and-pm/172
#' @references https://forum.airnowtech.org/t/the-aqi-equation/169
#' @references https://forum.airnowtech.org/t/how-does-airnow-handle-negative-hourly-concentrations/143
diff --git a/R/wrcc_loadAnnual.R b/R/wrcc_loadAnnual.R
index 2ddbf3fa..722d8e9f 100644
--- a/R/wrcc_loadAnnual.R
+++ b/R/wrcc_loadAnnual.R
@@ -43,7 +43,7 @@
#' }
#'
#' Available WRCC RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/WRCC/RData}{https://haze.airfire.org/monitoring/WRCC/RData}
+#' \href{https://haze.airfire.org/monitoring/WRCC/RData/}{https://haze.airfire.org/monitoring/WRCC/RData/}
#' @seealso \code{\link{wrcc_loadDaily}}
#' @seealso \code{\link{wrcc_loadLatest}}
#'
diff --git a/R/wrcc_loadDaily.R b/R/wrcc_loadDaily.R
index a5855a0d..adfcd8bb 100644
--- a/R/wrcc_loadDaily.R
+++ b/R/wrcc_loadDaily.R
@@ -45,7 +45,7 @@
#' }
#'
#' Avaialble WRCC RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/WRCC/RData/latest}{https://haze.airfire.org/monitoring/WRCC/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/WRCC/RData/latest/}{https://haze.airfire.org/monitoring/WRCC/RData/latest/}
#' @seealso \code{\link{wrcc_loadAnnual}}
#' @seealso \code{\link{wrcc_loadLatest}}
#' @examples
diff --git a/R/wrcc_loadLatest.R b/R/wrcc_loadLatest.R
index f3f75fa3..28ac71ac 100644
--- a/R/wrcc_loadLatest.R
+++ b/R/wrcc_loadLatest.R
@@ -45,7 +45,7 @@
#' }
#'
#' Avaialble RData and associated log files can be seen at:
-#' \href{https://haze.airfire.org/monitoring/WRCC/RData/latest}{https://haze.airfire.org/monitoring/WRCC/RData/latest}
+#' \href{https://haze.airfire.org/monitoring/WRCC/RData/latest/}{https://haze.airfire.org/monitoring/WRCC/RData/latest/}
#' @seealso \code{\link{wrcc_loadAnnual}}
#' @seealso \code{\link{wrcc_loadDaily}}
#' @examples
diff --git a/README.md b/README.md
index 545efbcf..39d056aa 100644
--- a/README.md
+++ b/README.md
@@ -1,8 +1,3 @@
----
-title: "PWFSLSmoke"
-pagetitle: PWFSLSmoke"
----
-
[](https://cran.r-project.org/package=PWFSLSmoke)
[](https://cran.r-project.org/package=PWFSLSmoke)
[](https://travis-ci.org/MazamaScience/PWFSLSmoke)
@@ -88,6 +83,6 @@ To run them you should:
----
This R package was created by [Mazama Science](http://mazamascience.com) and is
-being funded by the USFS [AirFire Research Team](https://airfire.org).
+being funded by the USFS [AirFire Research Team](https://www.airfire.org).
diff --git a/docs/404.html b/docs/404.html
index 1cbae232..e3a7b163 100644
--- a/docs/404.html
+++ b/docs/404.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -166,7 +166,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html
index 9a7f0259..b963911e 100644
--- a/docs/LICENSE-text.html
+++ b/docs/LICENSE-text.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -840,7 +840,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/Data_Model.html b/docs/articles/Data_Model.html
index 03d5a38f..d5295547 100644
--- a/docs/articles/Data_Model.html
+++ b/docs/articles/Data_Model.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -322,7 +322,7 @@
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/Maps_and_Timeseries_Plots.html b/docs/articles/Maps_and_Timeseries_Plots.html
index 47f82fb7..77693340 100644
--- a/docs/articles/Maps_and_Timeseries_Plots.html
+++ b/docs/articles/Maps_and_Timeseries_Plots.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -239,7 +239,7 @@ 2020-02-12
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/NowCast.html b/docs/articles/NowCast.html
index 658ba863..6b3eddea 100644
--- a/docs/articles/NowCast.html
+++ b/docs/articles/NowCast.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -127,7 +127,8 @@
The original algorithm, known as the Conroy method, was developed in 2003 to make real-time air quality measurements roughly comparable to established regulatory air quality health thresholds (e.g. 24‐hour PM2.5 standards). However, that method was shown to be slow to respond to rapidly changing air quality conditions, which, at best, reduced public confidence in disseminated AQI values, and at worst, had the potential to adversely affect the health of those in high impact areas (e.g. near wildfires).
In response, EPA developed a new method – the Reff method – in 2013 to be more responsive to rapidly changing air quality conditions. We provide technical support for applying the new NowCast algorithm to hourly PM2.5, PM10, and O3 data, though theoretically it could be applied to regular-interval time series data of any type, including other criteria pollutants.
We provide algorithm specifics for PM2.5, PM10, and O3 below.
-Sources:https://www3.epa.gov/airnow/ani/pm25_aqi_reporting_nowcast_overview.pdf https://forum.airnowtech.org/t/the-nowcast-for-ozone-and-pm/172
+Sources:https://en.wikipedia.org/wiki/NowCast_(air_quality_index)
+https://forum.airnowtech.org/t/the-nowcast-for-ozone-and-pm/172
Data Availability Requirements
To get a valid NowCast value, the NowCast algorithm simply requires valid data for at least two of the three most recent clock hours. This means that a valid NowCast value can be calculated from as little as two valid hours, even if 12 hours are typically used in the calculation.
-
Source:https://www3.epa.gov/airnow/ani/pm25_aqi_reporting_nowcast_overview.pdf
However, note that https://en.wikipedia.org/wiki/NowCast_(air_quality_index) says:
Because the most recent hours of data are weighted so heavily in the NowCast when PM levels are changing, EPA does not report the NowCast when data is missing for c1 or c2 .
@@ -272,7 +271,7 @@
Negative Values
-
In the NowCast literature we find no mention of negative values, which, while aphysical, are common in air quality monitoring data (see https://www3.epa.gov/ttn/amtic/files/2014conference/monpmpart3.pdf ). Thus, we do not adjust negative values up to zero in the monitor_nowcast()
function itself. However, note that this may be done when creating a ws_monitor
object in the first place.
+
In the NowCast literature we find no mention of negative values, which, while aphysical, are common in air quality monitoring data. Thus, we do not adjust negative values up to zero in the monitor_nowcast()
function itself. However, note that this may be done when creating a ws_monitor
object in the first place.
Negative values are handled prior to converting NowCast or other values to AQI.
@@ -707,7 +706,7 @@
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/PWFSLSmoke.html b/docs/articles/PWFSLSmoke.html
index 77d12e2a..00fbcf4e 100644
--- a/docs/articles/PWFSLSmoke.html
+++ b/docs/articles/PWFSLSmoke.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -192,7 +192,7 @@
Available data
-
The USFS AirFire group regularly processes monitoring data in support of their Monitoring Website . Pre-processed data files can be loaded from their servers by the following functions:
+
The USFS AirFire group regularly processes monitoring data in support of their Monitoring Website at tools.airfire.org/monitoring/v4
. Pre-processed data files can be loaded from their servers by the following functions:
~_load()
– load data based on a start- and end-time
@@ -216,16 +216,15 @@
A first example
Let’s say we are interested in the impact of smoke from the 2018 Camp Fire in the Sacramento area.
We would begin by creating a camp_fire
ws_monitor object that has all the monitors in California for the period of interest:
-
+ camp_fire <-
+ monitor_loadAnnual(2018) %>%
+ monitor_subset(stateCodes = 'CA') %>%
+ monitor_subset(tlim = c(20181108, 20181123))
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 %>%
@@ -253,8 +252,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:
+
Hopefully, this short introduction will encourage you to start using this package for your own analyses.
@@ -303,7 +303,7 @@
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html b/docs/articles/articles/Example_Denver_Air_Quality_Forecast.html
index a62c655e..ddc223a3 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.116
+ 1.2.117
@@ -137,8 +137,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" ,
@@ -154,8 +154,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 (
@@ -163,8 +163,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 ( )
@@ -229,7 +229,7 @@
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/articles/Example_Save_Data_as_CSV.html b/docs/articles/articles/Example_Save_Data_as_CSV.html
index b69c91e2..94f30946 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.116
+ 1.2.117
@@ -239,7 +239,7 @@ 2020-02-12
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/articles/articles/Loading_Monitoring_Data.html b/docs/articles/articles/Loading_Monitoring_Data.html
index e65ccced..03de5846 100644
--- a/docs/articles/articles/Loading_Monitoring_Data.html
+++ b/docs/articles/articles/Loading_Monitoring_Data.html
@@ -37,7 +37,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -306,7 +306,7 @@
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
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 483027fd..a073f687 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 2a455f7c..721f654d 100644
--- a/docs/articles/index.html
+++ b/docs/articles/index.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -177,7 +177,7 @@ All vignettes
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/authors.html b/docs/authors.html
index 024335d7..53890e97 100644
--- a/docs/authors.html
+++ b/docs/authors.html
@@ -78,7 +78,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -156,39 +156,39 @@ Authors
- Hans Martin . Author.
+
Hans Martin . Contributor.
- Spencer Pease . Author.
+
Spencer Pease . Contributor.
- Helen Miller . Author.
+
Helen Miller . Contributor.
- Zach Dingels . Author.
+
Zach Dingels . Contributor.
- Rohan Aras . Author.
+
Rohan Aras . Contributor.
- Jon Hagg . Author.
+
Jon Hagg . Contributor.
- Jimin Kim . Author.
+
Jimin Kim . Contributor.
- Rex Thompson . Author.
+
Rex Thompson . Contributor.
- Alice Yang . Author.
+
Alice Yang . Contributor.
@@ -201,7 +201,7 @@ Authors
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/index.html b/docs/index.html
index ac287999..db426ac6 100644
--- a/docs/index.html
+++ b/docs/index.html
@@ -24,10 +24,10 @@
the United States EPA <https://www.epa.gov/outdoor-air-quality-data> and
its AirNow air quality site <https://www.airnow.gov>.
Additional sources of PM2.5 data made accessible by the package include:
- AIRSIS (password protected) <https://www.oceaneering.com/data-management/>
+ AIRSIS (aka "Oceaneering", not public)
and WRCC <https://wrcc.dri.edu/cgi-bin/smoke.pl>.
- Data compilations are provided by PWFSL'
- <https://www.fs.fed.us/pnw/pwfsl/>.">
+ Data compilations are hosted by the USFS AirFire' research team
+ <https://www.airfire.org>.">
+
+
+
+
+
+
+
+
Camp Fire example dataset — Camp_Fire • PWFSLSmoke
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
The Camp_Fire
dataset provides a quickly loadable
+version of a ws_monitor object for practicing and code examples.
+
This dataset was was generated on 2021-11-18 by running:
+
+library(PWFSLSmoke)
+
+Camp_Fire <-
+ monitor_loadAnnual(2018) <!-- %>% -->
+ monitor_subset(stateCodes = 'CA') <!-- %>% -->
+ monitor_subset(tlim = c(20181108, 20181123))
+
+save(Camp_Fire, file = "data/Camp_Fire.RData")
+
+
+
+
+
Camp_Fire
+
+
+
+
+
A ws_monitor object with "meta" and "data" dataframes.
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
diff --git a/docs/reference/Carmel_Valley.html b/docs/reference/Carmel_Valley.html
index d27cfa49..e147c0c5 100644
--- a/docs/reference/Carmel_Valley.html
+++ b/docs/reference/Carmel_Valley.html
@@ -6,7 +6,7 @@
-
Carmel Valley Example Dataset — Carmel_Valley • PWFSLSmoke
+
Carmel Valley example dataset — Carmel_Valley • PWFSLSmoke
@@ -46,12 +46,13 @@
-
+
@@ -84,7 +85,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -153,28 +154,27 @@
In August of 2016, the Soberanes fire in California burned along the Big Sur
-coast. It was at the time the most expensive wildifre in US history. This dataset contains
+coast. It was at the time the most expensive wildfire in US history. This dataset contains
PM2.5 monitoring data for the monitor in Carmel Valley which shows heavy smoke
-as well as strong diurnal cycles associated with sea breezes. Data are stored
-as a ws_monitor object and are used in some examples in the package
-documentation.
+as well as strong diurnal cycles associated with sea breezes.
+
The Camp_Fire
dataset provides a quickly loadable
+version of a ws_monitor object for practicing and code examples.
+
documentation.
+
Carmel_Valley
-
A list with two elements
-
Details
-
-
Carmel Valley example dataset
+
A ws_monitor object with "meta" and "data" dataframes.
@@ -212,7 +215,7 @@
Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addMazamaMetadata.html b/docs/reference/addMazamaMetadata.html
index 15c94bdc..e3a7eb71 100644
--- a/docs/reference/addMazamaMetadata.html
+++ b/docs/reference/addMazamaMetadata.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -217,7 +217,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addPolygon.html b/docs/reference/addPolygon.html
index 0de9d016..c4f7a4a3 100644
--- a/docs/reference/addPolygon.html
+++ b/docs/reference/addPolygon.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -227,7 +227,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addShadedBackground.html b/docs/reference/addShadedBackground.html
index d5077ddb..f2cb4fab 100644
--- a/docs/reference/addShadedBackground.html
+++ b/docs/reference/addShadedBackground.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -209,7 +209,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addShadedNight.html b/docs/reference/addShadedNight.html
index 3ef24444..49d34236 100644
--- a/docs/reference/addShadedNight.html
+++ b/docs/reference/addShadedNight.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -187,7 +187,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addUSGSElevation.html b/docs/reference/addUSGSElevation.html
index dde5ad43..68ba6c41 100644
--- a/docs/reference/addUSGSElevation.html
+++ b/docs/reference/addUSGSElevation.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -205,7 +205,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addWindBarb.html b/docs/reference/addWindBarb.html
index f759302f..ecfc71d2 100644
--- a/docs/reference/addWindBarb.html
+++ b/docs/reference/addWindBarb.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -230,7 +230,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/addWindBarbs.html b/docs/reference/addWindBarbs.html
index 38b36701..a5bc790c 100644
--- a/docs/reference/addWindBarbs.html
+++ b/docs/reference/addWindBarbs.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -237,7 +237,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_createDataDataframes.html b/docs/reference/airnow_createDataDataframes.html
index e648397e..856990ca 100644
--- a/docs/reference/airnow_createDataDataframes.html
+++ b/docs/reference/airnow_createDataDataframes.html
@@ -109,7 +109,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -257,7 +257,12 @@ See a
Examples
@@ -271,7 +276,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_createMetaDataframes.html b/docs/reference/airnow_createMetaDataframes.html
index 5526027e..3411b16f 100644
--- a/docs/reference/airnow_createMetaDataframes.html
+++ b/docs/reference/airnow_createMetaDataframes.html
@@ -125,7 +125,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -281,7 +281,12 @@ See a
Examples
@@ -295,7 +300,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_createMonitorObjects.html b/docs/reference/airnow_createMonitorObjects.html
index 457fdca8..da16428e 100644
--- a/docs/reference/airnow_createMonitorObjects.html
+++ b/docs/reference/airnow_createMonitorObjects.html
@@ -106,7 +106,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -258,9 +258,14 @@ See a
Examples
@@ -274,7 +279,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_downloadHourlyData.html b/docs/reference/airnow_downloadHourlyData.html
index 1d56d360..92031e66 100644
--- a/docs/reference/airnow_downloadHourlyData.html
+++ b/docs/reference/airnow_downloadHourlyData.html
@@ -82,7 +82,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -199,7 +199,12 @@ See a
Examples
@@ -213,7 +218,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_downloadParseData.html b/docs/reference/airnow_downloadParseData.html
index 89b85853..7bded853 100644
--- a/docs/reference/airnow_downloadParseData.html
+++ b/docs/reference/airnow_downloadParseData.html
@@ -107,7 +107,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -250,7 +250,12 @@ See a
Examples
@@ -264,7 +269,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_downloadSites.html b/docs/reference/airnow_downloadSites.html
index 7dc276f6..6aabd5c2 100644
--- a/docs/reference/airnow_downloadSites.html
+++ b/docs/reference/airnow_downloadSites.html
@@ -48,7 +48,7 @@
@@ -83,7 +83,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -159,7 +159,7 @@ Download AirNow Site Location Metadata
The https://airnowtech.org site provides both air pollution
-monitoring data as well as monitoring site location metadata. This
+monitoring data as well as monitoring site location metadata. This
function retrieves the most recent version of the site location metadata file and returns it as a dataframe.
A description of the data format is publicly available at the
Monitoring Site Fact Sheet .
@@ -188,7 +188,7 @@
Value
Tibble of site location metadata.
Note
-
As of December, 2016, the monitoring_site_locations.dat
file has an encoding of
+
As of December, 2016, the monitoring_site_locations.dat
file has an encoding of
"CP437" (aka "Non-ISO extended-ASCII" or "IBMPC 437") and will be converted to "UTF-8"
so that French and Spanish language place names are properly encoded in the returned dataframe.
See also
@@ -197,7 +197,12 @@
See a
Examples
@@ -211,7 +216,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_load.html b/docs/reference/airnow_load.html
index 1bf512f4..8a6095bd 100644
--- a/docs/reference/airnow_load.html
+++ b/docs/reference/airnow_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -202,7 +202,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_loadAnnual.html b/docs/reference/airnow_loadAnnual.html
index fee2c311..4c026e0e 100644
--- a/docs/reference/airnow_loadAnnual.html
+++ b/docs/reference/airnow_loadAnnual.html
@@ -62,7 +62,7 @@
Available AirNow RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData" />
+https://haze.airfire.org/monitoring/AirNow/RData/" />
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -184,7 +184,7 @@ Load annual AirNow monitoring data
Available AirNow RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData
+https://haze.airfire.org/monitoring/AirNow/RData/
airnow_loadAnnual (
@@ -225,6 +225,9 @@ See a
Examples
@@ -245,7 +250,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_loadDaily.html b/docs/reference/airnow_loadDaily.html
index 986c2964..d835e153 100644
--- a/docs/reference/airnow_loadDaily.html
+++ b/docs/reference/airnow_loadDaily.html
@@ -61,7 +61,7 @@
Available AirNow RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData/latest" />
+https://haze.airfire.org/monitoring/AirNow/RData/latest/" />
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -182,7 +182,7 @@ Load recent AirNow monitoring data
Available AirNow RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData/latest
+https://haze.airfire.org/monitoring/AirNow/RData/latest/
airnow_loadDaily (
@@ -218,9 +218,14 @@ See a
Examples
@@ -234,7 +239,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_loadLatest.html b/docs/reference/airnow_loadLatest.html
index 2568dace..33d97d06 100644
--- a/docs/reference/airnow_loadLatest.html
+++ b/docs/reference/airnow_loadLatest.html
@@ -61,7 +61,7 @@
Avaialble RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData/latest" />
+https://haze.airfire.org/monitoring/AirNow/RData/latest/" />
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -182,7 +182,7 @@ Load most recent AirNow monitoring data
Avaialble RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AirNow/RData/latest
+https://haze.airfire.org/monitoring/AirNow/RData/latest/
airnow_loadLatest (
@@ -218,9 +218,14 @@ See a
Examples
@@ -234,7 +239,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airnow_qualityControl.html b/docs/reference/airnow_qualityControl.html
index 1e224714..7a825b37 100644
--- a/docs/reference/airnow_qualityControl.html
+++ b/docs/reference/airnow_qualityControl.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -192,7 +192,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_BAM1020QualityControl.html b/docs/reference/airsis_BAM1020QualityControl.html
index fc3fbe60..14606e02 100644
--- a/docs/reference/airsis_BAM1020QualityControl.html
+++ b/docs/reference/airsis_BAM1020QualityControl.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -235,7 +235,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_EBAMQualityControl.html b/docs/reference/airsis_EBAMQualityControl.html
index 48ec0b21..cbc55b84 100644
--- a/docs/reference/airsis_EBAMQualityControl.html
+++ b/docs/reference/airsis_EBAMQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -249,7 +249,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_EBAM_MULTI2QualityControl.html b/docs/reference/airsis_EBAM_MULTI2QualityControl.html
index ac1a815f..e1d60075 100644
--- a/docs/reference/airsis_EBAM_MULTI2QualityControl.html
+++ b/docs/reference/airsis_EBAM_MULTI2QualityControl.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -253,7 +253,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_EBAM_MULTI2_BQualityControl.html b/docs/reference/airsis_EBAM_MULTI2_BQualityControl.html
new file mode 100644
index 00000000..1c121892
--- /dev/null
+++ b/docs/reference/airsis_EBAM_MULTI2_BQualityControl.html
@@ -0,0 +1,272 @@
+
+
+
+
+
+
+
+
+
Apply Quality Control to raw AIRSIS EBAM MULTI2_B tibble — airsis_EBAM_MULTI2_BQualityControl • PWFSLSmoke
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
Perform various QC measures on AIRSIS EBAM MULT2 data. This data
+format began appearing in December, 2019 and is associated with data
+available at https://arb3.airsis.com.
+
The following columns of data are tested against valid ranges:
+
+
A POSIXct datetime
column (UTC) is also added based on Date.Time.GMT
.
+
+
+
airsis_EBAM_MULTI2_BQualityControl (
+ 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 , 50 ) ,
+ valid_Conc = c ( - Inf , 5 ) ,
+ flagAndKeep = FALSE
+)
+
+
Arguments
+
+
+
+ tbl
+ single site tibble created by airsis_parseData()
+
+
+ valid_Longitude
+ range of valid Longitude values
+
+
+ valid_Latitude
+ range of valid Latitude values
+
+
+ remove_Lon_zero
+ flag to remove rows where Longitude == 0
+
+
+ remove_Lat_zero
+ flag to remove rows where Latitude == 0
+
+
+ valid_Flow
+ range of valid Flow values
+
+
+ valid_AT
+ range of valid AT values
+
+
+ valid_RHi
+ range of valid RHi values
+
+
+ valid_Conc
+ range of valid ConcHr values
+
+
+ flagAndKeep
+ flag, rather than remove, bad data during the QC process
+
+
+
+
Value
+
+
Cleaned up tibble of AIRSIS monitor data.
+
See also
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
diff --git a/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html b/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
index a612b608..9d326e14 100644
--- a/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
+++ b/docs/reference/airsis_EBAM_PLUS_MULTIQualityControl.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -253,7 +253,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_ESAMQualityControl.html b/docs/reference/airsis_ESAMQualityControl.html
index 743797e9..55a12727 100644
--- a/docs/reference/airsis_ESAMQualityControl.html
+++ b/docs/reference/airsis_ESAMQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -249,7 +249,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_ESAM_MULTIQualityControl.html b/docs/reference/airsis_ESAM_MULTIQualityControl.html
index 3a05989a..3a1e910f 100644
--- a/docs/reference/airsis_ESAM_MULTIQualityControl.html
+++ b/docs/reference/airsis_ESAM_MULTIQualityControl.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -249,7 +249,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_availableUnits.html b/docs/reference/airsis_availableUnits.html
index 8ce1deef..3e6a127f 100644
--- a/docs/reference/airsis_availableUnits.html
+++ b/docs/reference/airsis_availableUnits.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -199,9 +199,14 @@ R
Examples
@@ -215,7 +220,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_createDataDataframe.html b/docs/reference/airsis_createDataDataframe.html
index e98e9a86..e20b5e9b 100644
--- a/docs/reference/airsis_createDataDataframe.html
+++ b/docs/reference/airsis_createDataDataframe.html
@@ -84,7 +84,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -197,7 +197,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_createMetaDataframe.html b/docs/reference/airsis_createMetaDataframe.html
index 8a6eecf1..a76dc1e9 100644
--- a/docs/reference/airsis_createMetaDataframe.html
+++ b/docs/reference/airsis_createMetaDataframe.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -252,7 +252,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_createMonitorObject.html b/docs/reference/airsis_createMonitorObject.html
index b6709849..1eb070c2 100644
--- a/docs/reference/airsis_createMonitorObject.html
+++ b/docs/reference/airsis_createMonitorObject.html
@@ -105,7 +105,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -294,11 +294,16 @@ See a
Examples
@@ -312,7 +317,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_createRawDataframe.html b/docs/reference/airsis_createRawDataframe.html
index 6592af07..184823b5 100644
--- a/docs/reference/airsis_createRawDataframe.html
+++ b/docs/reference/airsis_createRawDataframe.html
@@ -90,7 +90,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -243,6 +243,9 @@ See a
Examples
@@ -264,7 +269,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_downloadData.html b/docs/reference/airsis_downloadData.html
index 11ce3412..f55bbe5d 100644
--- a/docs/reference/airsis_downloadData.html
+++ b/docs/reference/airsis_downloadData.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -201,8 +201,13 @@ R
Examples
@@ -216,7 +221,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_identifyMonitorType.html b/docs/reference/airsis_identifyMonitorType.html
index d2f5ae08..66248363 100644
--- a/docs/reference/airsis_identifyMonitorType.html
+++ b/docs/reference/airsis_identifyMonitorType.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -211,8 +211,13 @@ R
Examples
@@ -226,7 +231,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_load.html b/docs/reference/airsis_load.html
index d06bc1de..3c79afcc 100644
--- a/docs/reference/airsis_load.html
+++ b/docs/reference/airsis_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -192,7 +192,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_loadAnnual.html b/docs/reference/airsis_loadAnnual.html
index 813ade6e..8794a350 100644
--- a/docs/reference/airsis_loadAnnual.html
+++ b/docs/reference/airsis_loadAnnual.html
@@ -62,7 +62,7 @@
Available AIRSIS RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData" />
+https://haze.airfire.org/monitoring/AIRSIS/RData/" />
@@ -94,7 +94,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -184,7 +184,7 @@ Load annual AIRSIS monitoring data
Available AIRSIS RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData
+https://haze.airfire.org/monitoring/AIRSIS/RData/
airsis_loadAnnual (
@@ -225,6 +225,9 @@ See a
Examples
@@ -245,7 +250,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_loadDaily.html b/docs/reference/airsis_loadDaily.html
index a4360038..9d11b1a9 100644
--- a/docs/reference/airsis_loadDaily.html
+++ b/docs/reference/airsis_loadDaily.html
@@ -61,7 +61,7 @@
Avaialble AIRSIS RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData/latest" />
+https://haze.airfire.org/monitoring/AIRSIS/RData/latest/" />
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -182,7 +182,7 @@ Load recent AIRSIS monitoring data
Avaialble AIRSIS RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData/latest
+https://haze.airfire.org/monitoring/AIRSIS/RData/latest/
airsis_loadDaily (
@@ -218,9 +218,14 @@ See a
Examples
@@ -234,7 +239,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_loadLatest.html b/docs/reference/airsis_loadLatest.html
index 580005de..3f2adae4 100644
--- a/docs/reference/airsis_loadLatest.html
+++ b/docs/reference/airsis_loadLatest.html
@@ -61,7 +61,7 @@
Avaialble RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData/latest" />
+https://haze.airfire.org/monitoring/AIRSIS/RData/latest/" />
@@ -93,7 +93,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -182,7 +182,7 @@ Load most recent AIRSIS monitoring data
Avaialble RData and associated log files can be seen at:
-https://haze.airfire.org/monitoring/AIRSIS/RData/latest
+https://haze.airfire.org/monitoring/AIRSIS/RData/latest/
airsis_loadLatest (
@@ -218,9 +218,14 @@ See a
Examples
@@ -234,7 +239,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_parseData.html b/docs/reference/airsis_parseData.html
index 0a7961c6..3a102190 100644
--- a/docs/reference/airsis_parseData.html
+++ b/docs/reference/airsis_parseData.html
@@ -92,7 +92,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -203,10 +203,15 @@ R
Examples
@@ -220,7 +225,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/airsis_qualityControl.html b/docs/reference/airsis_qualityControl.html
index 72755006..03f31e8f 100644
--- a/docs/reference/airsis_qualityControl.html
+++ b/docs/reference/airsis_qualityControl.html
@@ -100,7 +100,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -233,7 +233,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/aqiColors.html b/docs/reference/aqiColors.html
index 312f107b..b500461c 100644
--- a/docs/reference/aqiColors.html
+++ b/docs/reference/aqiColors.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -219,7 +219,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/aqiPalette.html b/docs/reference/aqiPalette.html
index 7e5b310e..38ea5760 100644
--- a/docs/reference/aqiPalette.html
+++ b/docs/reference/aqiPalette.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -199,7 +199,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/createEmptyMetaDataframe.html b/docs/reference/createEmptyMetaDataframe.html
index a7bbce9b..0931c063 100644
--- a/docs/reference/createEmptyMetaDataframe.html
+++ b/docs/reference/createEmptyMetaDataframe.html
@@ -92,7 +92,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -213,7 +213,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/createEmptyMonitor.html b/docs/reference/createEmptyMonitor.html
index 4ccdcb9b..84639785 100644
--- a/docs/reference/createEmptyMonitor.html
+++ b/docs/reference/createEmptyMonitor.html
@@ -89,7 +89,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -200,7 +200,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/distance.html b/docs/reference/distance.html
index 4848cd28..68c14b4d 100644
--- a/docs/reference/distance.html
+++ b/docs/reference/distance.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -209,7 +209,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/downloadDataFile.html b/docs/reference/downloadDataFile.html
index b34ebfeb..88c9a5ca 100644
--- a/docs/reference/downloadDataFile.html
+++ b/docs/reference/downloadDataFile.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -212,7 +212,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_createDataDataframe.html b/docs/reference/epa_createDataDataframe.html
index df48a1a3..6fec62dc 100644
--- a/docs/reference/epa_createDataDataframe.html
+++ b/docs/reference/epa_createDataDataframe.html
@@ -85,7 +85,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -195,7 +195,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_createMetaDataframe.html b/docs/reference/epa_createMetaDataframe.html
index 363f0bbc..95335bad 100644
--- a/docs/reference/epa_createMetaDataframe.html
+++ b/docs/reference/epa_createMetaDataframe.html
@@ -96,7 +96,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -238,7 +238,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_createMonitorObject.html b/docs/reference/epa_createMonitorObject.html
index 64704c23..cab73086 100644
--- a/docs/reference/epa_createMonitorObject.html
+++ b/docs/reference/epa_createMonitorObject.html
@@ -79,7 +79,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -193,9 +193,14 @@ R
Examples
@@ -209,7 +214,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_downloadData.html b/docs/reference/epa_downloadData.html
index 2d9279ac..e35f8ffa 100644
--- a/docs/reference/epa_downloadData.html
+++ b/docs/reference/epa_downloadData.html
@@ -98,7 +98,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -235,8 +235,13 @@ R
Examples
@@ -250,7 +255,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_load.html b/docs/reference/epa_load.html
index f14cc105..72b3095f 100644
--- a/docs/reference/epa_load.html
+++ b/docs/reference/epa_load.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -197,7 +197,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_loadAnnual.html b/docs/reference/epa_loadAnnual.html
index 154da415..0a055526 100644
--- a/docs/reference/epa_loadAnnual.html
+++ b/docs/reference/epa_loadAnnual.html
@@ -87,7 +87,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -210,9 +210,14 @@ R
Examples
@@ -226,7 +231,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/epa_parseData.html b/docs/reference/epa_parseData.html
index 22f0ecf4..f7841a26 100644
--- a/docs/reference/epa_parseData.html
+++ b/docs/reference/epa_parseData.html
@@ -114,7 +114,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -252,8 +252,13 @@ R
Examples
@@ -267,7 +272,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/esriToken.html b/docs/reference/esriToken.html
index fe13a6fd..b0a991a9 100644
--- a/docs/reference/esriToken.html
+++ b/docs/reference/esriToken.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -179,7 +179,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/generic_downloadData.html b/docs/reference/generic_downloadData.html
index 9474b372..4e395463 100644
--- a/docs/reference/generic_downloadData.html
+++ b/docs/reference/generic_downloadData.html
@@ -80,7 +80,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -181,10 +181,15 @@ Details
Examples
@@ -198,7 +203,7 @@ Contents
-
Developed by Jonathan Callahan, Hans Martin, Spencer Pease, Helen Miller, Zach Dingels, Rohan Aras, Jon Hagg, Jimin Kim, Rex Thompson, Alice Yang.
+
Developed by Jonathan Callahan.
diff --git a/docs/reference/generic_parseData.html b/docs/reference/generic_parseData.html
index 1f489f96..e383de53 100644
--- a/docs/reference/generic_parseData.html
+++ b/docs/reference/generic_parseData.html
@@ -81,7 +81,7 @@
PWFSLSmoke
- 1.2.116
+ 1.2.117
@@ -214,14 +214,15 @@ Examp
configList <- jsonlite :: fromJSON ( configPath )
fileString <- generic_downloadData ( filePath )
-#> INFO [2021-10-11 14:45:45] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmppICYoH/temp_libpath156387e7bb6b3/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-10-11 14:45:45] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmppICYoH/temp_libpath156387e7bb6b3/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-10-11 14:45:45] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmppICYoH/temp_libpath156387e7bb6b3/PWFSLSmoke/extdata/generic_data_example.csv
-#> INFO [2021-10-11 14:45:45] Reading file from location:
-#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmppICYoH/temp_libpath156387e7bb6b3/PWFSLSmoke/extdata/generic_data_example.csv
parsedData <- generic_parseData ( fileString , configList )
+
#> INFO [2021-11-19 10:17:41] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpQZWbh3/temp_libpath95c8341a1006/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-11-19 10:17:41] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpQZWbh3/temp_libpath95c8341a1006/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-11-19 10:17:41] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpQZWbh3/temp_libpath95c8341a1006/PWFSLSmoke/extdata/generic_data_example.csv
+#> INFO [2021-11-19 10:17:41] Reading file from location:
+#> /private/var/folders/84/y311lppx4519st7n8_gfkd1w0000gn/T/RtmpQZWbh3/temp_libpath95c8341a1006/PWFSLSmoke/extdata/generic_data_example.csv
parsedData <- generic_parseData ( fileString , configList )
+