Current Dropbox data: PTR

Author

COMPASS workflows team

Published

2025-07-20 16:48:09-04:00

Data path: /Users/bpbond/Library/CloudStorage/Dropbox

Data folder: COMPASS_PNNL_Data

Current data: current_data

Sapflow

Code
sf <- read_files("Sapflow")
Found 2 files
Code
no_data_check(sf, "Sapflow")
94350 data rows
Code
sf %>% 
  filter(name != "BattV_Avg") %>%  # probably we don't care about this
  separate(Statname, into = c("X", "Site", "Plot")) %>% 
  mutate(port = gsub("DiffVolt._Avg\\(", "", name),
         port = as.integer(gsub(")", "", port)),
         port = as.factor(port)) -> 
  sf

p <- ggplot(sf, aes(TIMESTAMP, value, color = port)) +
  facet_grid(Plot ~ .) +
  geom_point(na.rm = TRUE)
print(p)

Code
p <- p + ylim(c(0, 1)) + ggtitle("Data in 0-1 range only")
print(p)

No data found example

Code
no_data_check(tibble(), "example")
0 data rows
No Data

No data files were found for example