Results from the first sonde deployment on Malden River 7/17/15.
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/Malden_River/20150717/deploy/EXO_SD_13A101850_071715_142000.csv",
strip.white=TRUE, skip=24, header = FALSE, as.is=TRUE,
col.names=c('DATE', 'TIME', 'TIME_FRAC', 'SITE', 'FAULT_CODE','BATT_V','CABLE_PWR',
'TURB','TSS', 'CHL_RFU', 'CHL_ug_L','BGA_PC_RFU',
'BGA_PC_ug_L',
'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="UTC") %>%
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()