There were 78 profile CTD stations on COR2019002, each has been processed into an ODF and quality controlled by IML procedures.
Load data for mapping
for(i in 2:length(odfs)){
if(i != 3){
st_df <- pos_df %>%
dplyr::filter(., station == station_names[[i]])
cat(st_df$station)
pp <- profile_plot(as.data.frame(odfs[[i]]@data))
tsplot <- plotTS_EC(x = as.data.frame(odfs[[i]]@data) , salinity = 'salinity', temperature = 'temperature')
map <- ggplot() +
geom_polygon(data = clwf, aes(x = longitude, y = latitude))+
scale_x_continuous(limits = c(-70, -60))+
scale_y_continuous(limits = c(40, 50))+
coord_map(xlim = c(-67, -60), ylim = c(45, 50)) +
theme_classic()+
geom_point(data = st_df, aes(x = longitude, y = latitude), shape = 21, size = 5, col = 'darkred')+
ggrepel::geom_label_repel(data = st_df, aes(x = longitude, y = latitude, label = station), fill = 'gray70', size = 2 ) +
theme(axis.text = element_text(size = 15))+
stat_contour(data = bathy_data_list[[1]],
aes(x=x, y=y, z=z),
breaks=c(-50),
size=c(0.6),
colour = "gray61") +
stat_contour(data = bathy_data_list[[1]],
aes(x=x, y=y, z=z),
breaks=c(-100),
size=c(0.6),
colour = "gray41") +
stat_contour(data = bathy_data_list[[1]],
aes(x=x, y=y, z=z),
breaks=c(-150),
size=c(0.6),
colour = "black")
suppressWarnings(
gridExtra::grid.arrange( tsplot, map,nrow = 1, top = st_df$station, widths = c(400, 300) )
)
remove(tsplot, map, pp, st_df)
}
}
## W5
## W13
## W15
## W22
## W29
## W32
## W38
## W53
## W57
## W68
## W71
## W85
## W98
## W100
## z1
## z2
## Z4
## Z4_2
## CAP
## 7.6
## P1-1
## P1-1_2
## P1-2
## P1-2_2
## P1-3
## P1-4
## P1-4_2
## P1-5
## P1-5_2
## 7.5
## SHED
## 6.5
## 6.55
## 7.25
## 7.3
## 6.3
## 5.35
## 5.3
## 5.45
## Z5
## Z6
## Z7
## Z8
## P2-1
## P2-2
## P2-4
## P2-5
## P2-6
## P2-7
## Z9
## Z10
## 7.5_2
## Z11
## CGR1-6
## Z12
## Z13
## 7.6_2
## Z14
## Z15
## Z16
## Z16_2
## K1