## Parsed with column specification:
## cols(
##   date = col_character(),
##   time = col_time(format = ""),
##   `depth(m)` = col_double(),
##   `temp(cel)` = col_double(),
##   salinity = col_double(),
##   `sigmaT(kg/m3)` = col_double()
## )
regexes <- tribble(
  ~ regex, ~ month_num,
  "Jan", "1",
  "Feb", "2",
  "Mar", "3",
  "Apr", "4",
  "May", "5",
  "Jun", "6",
  "Jul", "7",
  "Aug", "8",
  "Sep", "9",
  "Oct", "10",
  "Nov", "11",
  "Dec", "12",
)

Temperature

st27wdate  %>% 
  filter(date2 >= "1963-01-01" & date2 <= "1992-01-01") %>% 
  filter(depth == 0 | depth == 50 | depth == 175) %>% 
  ggplot(aes(date2,temp, color = as.factor(depth), group = depth)) + 
  geom_line() + facet_wrap(~month_num) + 
  labs(x = "Year", y = "Temperature (C)",color = "Depth")

Depth = 0 m

Depth = 175 m

Salinity

st27wdate  %>% 
  filter(date2 >= "1963-01-01" & date2 <= "1992-01-01") %>% 
  filter(depth == 0 | depth == 50 | depth == 175) %>% 
  ggplot(aes(date2,salinity, color = as.factor(depth), group = depth)) + 
  geom_line() + facet_wrap(~month_num) + 
  labs(x = "Year", y = "Salinity",color = "Depth") + theme(legend.position = "right")

Sigma T

st27wdate  %>% 
  filter(date2 >= "1963-01-01" & date2 <= "1992-01-01") %>% 
  filter(depth == 0 | depth == 50 | depth == 175) %>% 
  ggplot(aes(date2,sigmaT, color = as.factor(depth), group = depth)) + 
  geom_line() + facet_wrap(~month_num) + 
  labs(x = "Year", y = "SigmaT",color = "Depth") + theme(legend.position = "right")

# Detect the operating system
os.use<- .Platform$OS.type

# Set path to shared folders

           #########CHANGE THIS COMPUTER NAME IF PC
computer.name<- "lcarlson" # Needed for PC users
sst.path<- switch(os.use, 
                     "windows" = paste("C:/Users/", computer.name, "/Box/Mills Lab/Projects/Atlantic salmon/Shared data/migration area SST", sep = ""))
sst<-read_csv(paste(sst.path,"/migrationareasERSST.csv",sep = ""))
## Warning: Removed 1 rows containing missing values (geom_path).