Loading packages

library(ggplot2)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(tidyr)
library(gridExtra)
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine

Ground Temperatures for all sites data prepping

# importing ground temp data for 6-19 through 9-20

grndtmp619_920=read.csv("~/Desktop/UVA/RESEARCH/Barrow/Data_June17-Aug5/Season_GRNDTMP_6_19_22_9_20_22_2022_09_21_16_19_26_UTC_1.csv")
 
# data cleaning for dataset
names(grndtmp619_920) <- sub("....C..RX3000_BRW1", "", names(grndtmp619_920))
names(grndtmp619_920) <- sub("....C..RX3000_BRW4", "", names(grndtmp619_920))
names(grndtmp619_920) <- sub("....C..RX3000_BRW5", "", names(grndtmp619_920))
names(grndtmp619_920) <- sub("....C..RX3000_BRW6", "", names(grndtmp619_920))
names(grndtmp619_920) <- sub("..RXW.GP6.", "", names(grndtmp619_920))
grndtmp619_920$Date <-as.POSIXct(grndtmp619_920$Date,format="%m/%d/%y %H:%M",tz="UTC")

Ground Moisture for all sites data prepping

mst619_920=read.csv("~/Desktop/UVA/RESEARCH/Barrow/Data_June17-Aug5/Season_VWC_6_19_22_9_20_22_2022_09_21_16_11_28_UTC_1.csv")

names(mst619_920) <- sub("...m.3.m.3..RX3000_BRW1", "", names(mst619_920))
names(mst619_920) <- sub("...m.3.m.3..RX3000_BRW4", "", names(mst619_920))
names(mst619_920) <- sub("...m.3.m.3..RX3000_BRW5", "", names(mst619_920))
names(mst619_920) <- sub("...m.3.m.3..RX3000_BRW6", "", names(mst619_920))
names(mst619_920) <- sub("..RXW.GP6.", "", names(mst619_920))
mst619_920$Date <-as.POSIXct(mst619_920$Date,format="%m/%d/%y %H:%M",tz="UTC")

Removing 0’s (only run this chunk if you would like perfect values of 0 removed from the VWC data)

mst619_920[mst619_920 == 0.000] <- NA

Removing 0’s (only run this chunk if you would like perfect values of 0 removed from the Ground Temperature data)

grndtmp619_920[grndtmp619_920 == 0.0] <- NA
# Solar Radiation THNA ##next step

Making combined layouts with figures

THNA Ground Temperature Layout All Depths

a = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21198259.21206939.8, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Temperature21198259.21393047.8, color = "THNA SC")) +
  geom_line(mapping = aes(y=Temperature21198259.21398593.8, color = "THNA SA")) +
  geom_line(mapping = aes(y=Temperature21198259.21398601.8, color = "THNA SB")) +
  labs (title= "THNA Ground Temperature (10 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SA"="green", "THNA SB"="red", "THNA SC"="purple"))

b = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21198259.21206939.11, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Temperature21198259.21393047.11, color = "THNA SC")) +
  geom_line(mapping = aes(y=Temperature21198259.21398593.11, color = "THNA SA")) +
  geom_line(mapping = aes(y=Temperature21198259.21398601.11, color = "THNA SB")) +
  labs (title= "THNA Ground Temperature (40 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SA"="green", "THNA SB"="red", "THNA SC"="purple"))

c = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21198259.21206939.17, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Temperature21198259.21393047.17, color = "THNA SC")) +
  geom_line(mapping = aes(y=Temperature21198259.21398593.17, color = "THNA SA")) +
  geom_line(mapping = aes(y=Temperature21198259.21398601.17, color = "THNA SB")) +
  labs (title= "THNA Ground Temperature (90 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SA"="green", "THNA SB"="red", "THNA SC"="purple"))
  
plots <- list(a,b,c)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 2 row(s) containing missing values (geom_path).
## Warning: Removed 13 row(s) containing missing values (geom_path).

SSMH Ground Temperature Layout All Depths

d = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401801.21393049.8, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Temperature21401801.21398599.8, color = "SSMH SA")) +
  geom_line(mapping = aes(y=Temperature21401801.21393044.8, color = "SSMH SB")) +
  labs (title= "SSMH Ground Temperature (10 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))

e = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401801.21393049.11, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Temperature21401801.21398599.11, color = "SSMH SA")) +
  geom_line(mapping = aes(y=Temperature21401801.21393044.11, color = "SSMH SB")) +
  labs (title= "SSMH Ground Temperature (40 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))

f = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401801.21393049.17, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Temperature21401801.21398599.17, color = "SSMH SA")) +
  geom_line(mapping = aes(y=Temperature21401801.21393044.17, color = "SSMH SB")) +
  labs (title= "SSMH Ground Temperature (90 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))

  
plots <- list(d,e,f)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 97 row(s) containing missing values (geom_path).
## Warning: Removed 8 row(s) containing missing values (geom_path).
## Warning: Removed 97 row(s) containing missing values (geom_path).
## Warning: Removed 592 row(s) containing missing values (geom_path).

BUECI Ground Temperature Layout All Depths

g = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401800.21398585.8, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398590.8, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Temperature21401800.21398583.8, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Temperature21401800.21393042.8, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Temperature21401800.21398584.8, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Temperature21401800.21398579.8, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398578.8, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Temperature21401800.21398598.8, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Temperature (10 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))

h = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401800.21398585.11, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398590.11, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Temperature21401800.21398583.11, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Temperature21401800.21393042.11, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Temperature21401800.21398584.11, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Temperature21401800.21398579.11, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398578.11, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Temperature21401800.21398598.11, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Temperature (40 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))

i = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401800.21398585.17, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398590.17, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Temperature21401800.21398583.17, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Temperature21401800.21393042.17, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Temperature21401800.21398584.17, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Temperature21401800.21398579.17, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Temperature21401800.21398578.17, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Temperature21401800.21398598.17, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Temperature (90 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))

plots <- list(g,h,i)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7014 row(s) containing missing values (geom_path).
## Warning: Removed 7753 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7525 row(s) containing missing values (geom_path).
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7014 row(s) containing missing values (geom_path).
## Warning: Removed 7753 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7525 row(s) containing missing values (geom_path).
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6403 row(s) containing missing values (geom_path).
## Warning: Removed 7013 row(s) containing missing values (geom_path).
## Warning: Removed 7753 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7524 row(s) containing missing values (geom_path).

BEO Ground Temperature Layout All Depths

j = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401803.21393048.8, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Temperature21401803.21398591.8, color = "BEO-B05")) +
  labs (title= "BEO Ground Temperature (10 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))

k = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401803.21393048.11, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Temperature21401803.21398591.11, color = "BEO-B05")) +
  labs (title= "BEO Ground Temperature (40 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))

l = ggplot(data = grndtmp619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Temperature21401803.21393048.17, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Temperature21401803.21398591.17, color = "BEO-B05")) +
  labs (title= "BEO Ground Temperature (90 cm)", y="Temperature (°C)",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=c(-5,-2.5,0,2.5,5,7.5,10,12.5,15), limits=c(-6, 14)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))
  
plots <- list(j,k,l)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).
## Warning: Removed 3785 row(s) containing missing values (geom_path).
## Warning: Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).


THNA Ground Moisture Layout All Depths

a = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21198259.21206939.2, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398593.2, color = "THNA SA")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398601.2, color = "THNA SB")) +
  geom_line(mapping = aes(y=Water.Content21198259.21393047.2, color = "THNA SC")) +
  labs (title= "THNA Ground Moisture (15-30 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SC"="green", "THNA SA"="red", "THNA SB"="purple"))

b = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21198259.21206939.3, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398593.3, color = "THNA SA")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398601.3, color = "THNA SB")) +
  geom_line(mapping = aes(y=Water.Content21198259.21393047.3, color = "THNA SC")) +
  labs (title= "THNA Ground Moisture (30-45 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SA"="green", "THNA SB"="red", "THNA SC"="purple"))

c = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21198259.21206939.6, color = "THNA BASE")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398593.6, color = "THNA SA")) +
  geom_line(mapping = aes(y=Water.Content21198259.21398601.6, color = "THNA SB")) +
  geom_line(mapping = aes(y=Water.Content21198259.21393047.6, color = "THNA SC")) +
  labs (title= "THNA Ground Moisture (75-90 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("THNA BASE"="blue", "THNA SA"="green", "THNA SB"="red", "THNA SC"="purple"))

 
plots <- list(a,b,c)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 831 row(s) containing missing values (geom_path).
## Warning: Removed 1333 row(s) containing missing values (geom_path).
## Warning: Removed 1747 row(s) containing missing values (geom_path).
## Warning: Removed 7900 row(s) containing missing values (geom_path).

SSMH Ground Moisture Layout All Depths

d = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401801.21393044.2, color = "SSMH SB")) +
  geom_line(mapping = aes(y=Water.Content21401801.21393049.2, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Water.Content21401801.21398599.2, color = "SSMH SA")) +
  labs (title= "SSMH Ground Moisture (15-30 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))

e = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401801.21393044.3, color = "SSMH SB")) +
  geom_line(mapping = aes(y=Water.Content21401801.21393049.3, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Water.Content21401801.21398599.3, color = "SSMH SA")) +
  labs (title= "SSMH Ground Moisture (30-45 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))

f = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401801.21393044.6, color = "SSMH SB")) +
  geom_line(mapping = aes(y=Water.Content21401801.21393049.6, color = "SSMH BASE")) +
  geom_line(mapping = aes(y=Water.Content21401801.21398599.6, color = "SSMH SA")) +
  labs (title= "SSMH Ground Moisture (75-90 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) + 
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("SSMH BASE"="blue", "SSMH SA"="green", "SSMH SB"="red"))
  
plots <- list(d,e,f)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 97 row(s) containing missing values (geom_path).
## Removed 97 row(s) containing missing values (geom_path).
## Warning: Removed 611 row(s) containing missing values (geom_path).
## Warning: Removed 97 row(s) containing missing values (geom_path).
## Warning: Removed 3444 row(s) containing missing values (geom_path).
## Warning: Removed 3700 row(s) containing missing values (geom_path).

BUECI Ground Moisture Layout All Depths

g = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401800.21398585.2, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398590.2, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398583.2, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Water.Content21401800.21393042.2, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398584.2, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398579.2, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398578.2, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398598.2, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Moisture (15-30 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))

h = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401800.21398585.3, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398590.3, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398583.3, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Water.Content21401800.21393042.3, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398584.3, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398579.3, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398578.3, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398598.3, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Moisture (30-45 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))

i = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401800.21398585.6, color = "BUECI BASE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398590.6, color = "BUECI SA")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398583.6, color = "BUECI SB")) +
  geom_line(mapping = aes(y=Water.Content21401800.21393042.6, color = "BUECI SC")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398584.6, color = "BUECI SD")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398579.6, color = "BUECI SE")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398578.6, color = "BUECI SF.01")) +
  geom_line(mapping = aes(y=Water.Content21401800.21398598.6, color = "BUECI SF.02")) +
  labs (title= "BUECI Ground Moisture (75-90 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BUECI BASE"="blue", "BUECI SA"="purple", "BUECI SB"="red", "BUECI SC"="green", "BUECI SD"="orange","BUECI SE"="magenta1", "BUECI SF.01"="steelblue1", "BUECI SF.02"="seagreen2"))
  
plots <- list(g,h,i)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7900 row(s) containing missing values (geom_path).
## Removed 7900 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7525 row(s) containing missing values (geom_path).
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7900 row(s) containing missing values (geom_path).
## Removed 7900 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7525 row(s) containing missing values (geom_path).
## Warning: Removed 6350 row(s) containing missing values (geom_path).
## Warning: Removed 7754 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7014 row(s) containing missing values (geom_path).
## Warning: Removed 7900 row(s) containing missing values (geom_path).
## Warning: Removed 6351 row(s) containing missing values (geom_path).
## Warning: Removed 7689 row(s) containing missing values (geom_path).
## Warning: Removed 7525 row(s) containing missing values (geom_path).

BEO Ground Moisture Layout All Depths

j = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401803.21393048.2, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Water.Content21401803.21398591.2, color = "BEO-B05")) +
  labs (title= "BEO Ground Moisture (15-30 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))

k = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401803.21393048.3, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Water.Content21401803.21398591.3, color = "BEO-B05")) +
  labs (title= "BEO Ground Moisture (30-45 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))

l = ggplot(data = mst619_920, mapping = aes(x=Date)) +
  geom_line(mapping = aes(y=Water.Content21401803.21393048.6, color = "BEO-B06")) +
  geom_line(mapping = aes(y=Water.Content21401803.21398591.6, color = "BEO-B05")) +
  labs (title= "BEO Ground Moisture (75-90 cm)", y="Volumetric Water Content ("~m^3~"/"~m^3~")",color="Station") +
  scale_x_datetime(date_breaks = "1 weeks") + theme_classic() +
  theme(axis.text.x=element_text(angle = 45, hjust = 1), axis.line = element_line(colour = "black", size =0.5, linetype = "solid")) +
  scale_y_continuous(breaks=seq(0.0, 0.6, 0.1), limits=c(0, 0.6)) +
  scale_color_manual(values = c("BEO-B05"="blue", "BEO-B06"="red"))

  
plots <- list(j,k,l)

layout <- rbind(c(1,2),c(3,4))

grid.arrange(grobs=plots,layout_matrix=layout)
## Warning: Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).
## Removed 3550 row(s) containing missing values (geom_path).
## Warning: Removed 4631 row(s) containing missing values (geom_path).
## Warning: Removed 3550 row(s) containing missing values (geom_path).