Results from the first sonde deployment on Spy Pond, 6/26/15. 1.43 inches of rain fell on June 28. Sonde was deployed at least 18-24 inches below the surface. Post-event reading of sonde in saturated water in lab was 100.3%
library(dplyr)
library(ggplot2)
library(reshape2)
library(lubridate)
#setwd("\\\\psf/Home/Dropbox/")
setwd("c:/Users/Katrina/Dropbox/")
# read file, ignore header, simplify column names
# Code adapted from Jeff Walker, http://rpubs.com/heflopod/myrwa-basin-survey-20140806
oxy1 <- read.csv(
"Dissolved Oxygen Surveys/DO_2015/Spy_Pond/20150626/EXO_SD_13A101850_062615_145905.csv",
strip.white=TRUE, skip=23, header = FALSE, as.is=TRUE,
col.names=c('DATE', 'TIME', 'TIME_FRAC', 'SITE', 'FAULT_CODE','BATT_V','CABLE_PWR',
'TURB','TSS','TEMP', 'COND', 'SPCOND', 'SAL', 'TDS',
'DO_SAT','DO','PRESS','DEPTH'))
# Parse date/times and convert from UTC to US/Eastern [UPDATE: sonde was already set to EDT]
# Code borrowed from Jeff Walker, http://rpubs.com/heflopod/myrwa-basin-survey-20140806
oxy2 <- mutate(oxy1, DATETIME=paste(DATE, TIME, sep=' ') %>%
mdy_hms(tz="US/Eastern") %>%
with_tz(tzone="US/Eastern"))
# View(oxy2)
g <- ggplot(oxy2, aes(DATETIME, DO_SAT))
g + geom_line()
g <- ggplot(oxy2, aes(DATETIME, DO))
g + geom_line()
g <- ggplot(oxy2, aes(DATETIME, TEMP))
g + geom_line()
g <- ggplot(oxy2, aes(DATETIME, SPCOND))
g + geom_line() + scale_y_continuous(limits=c(1600, 1800))
## Warning in loop_apply(n, do.ply): Removed 35 rows containing missing values
## (geom_path).