A pipeline for evaluating the PS2 data from Sarah Kezar’s experiment This is a part of a series of experiments on Parthenium sp. from various locations.
OK - now let’s explore whats happening in the PS2 data!
Because the original output file is having some nonsense lines as we export it from the PS2 analyzer - we need to remove them:
PS2 <- read.csv("Exp_10191_Data_Analysis.csv")
PS2
For this specific experiment - in order to analyze the results per OVERALL canopy - let’s keep ONLY “all”
PS3 <- subset(PS2, PS2$Obj.No == "All")
PS3
get only the columns that are informative biologically (for now):
colnames(PS3)
## [1] "File" "Date" "Time" "Obj.No"
## [5] "nTmPam" "Obj.Size" "Obj.Xc" "Obj.Yc"
## [9] "Fv.Fm" "s.d." "Fq..Fm." "s.d..1"
## [13] "NPQ" "s.d..2" "F0." "s.d..3"
## [17] "qP" "s.d..4" "qN" "s.d..5"
## [21] "qL" "s.d..6" "qE" "s.d..7"
## [25] "qI" "s.d..8" "D.no" "s.d..9"
## [29] "D.npq" "s.d..10" "npq.t." "s.d..11"
## [33] "Red" "s.d..12" "Green" "s.d..13"
## [37] "Blue" "s.d..14" "Hue" "s.d..15"
## [41] "Saturation" "s.d..16" "Value" "s.d..17"
## [45] "SpcGrn" "s.d..18" "FarRed" "s.d..19"
## [49] "Nir" "s.d..20" "ChlIdx" "s.d..21"
## [53] "AriIdx" "s.d..22" "NDVI" "s.d..23"
## [57] "Border" "Mask.Border" "Points" "Area..CH."
## [61] "Mask.Area..CH." "X.Centre" "Y.Centre" "Radius"
## [65] "Area..MC." "Mask.Area..MC." "Width" "Height"
## [69] "Area..MR." "Mask.Area..MR." "Alpha" "Size..SK."
## [73] "Junction..SK." "Endpoint..SK." "Path..SK."
PS4 <- PS3[,c(1:3, 6, 9, 11, 13, 17, 19, 21, 23, 25, 27, 29, 31, 51, 53, 55)]
PS4
library(ggplot2)
library(ggpubr)
PS4$Date <- as.factor(PS4$Date)
lgraph <- ggplot(data=PS4, aes(x= Date, y=ChlIdx))
lgraph <- lgraph + geom_point(alpha = 0.7)
lgraph <- lgraph + ylab("Chlorophylll Index") + xlab("days after stress")
lgraph
This is great start, but lets isolate the measurement per tray ID -
which is the third item in the File name
(HDR_ExpID_TrayID_roundID.INF)
How do we get there?
strsplit(PS4$File[1], "_")[[1]][3]
## [1] "39997"
Now - lets isolate it for the entire data sheet:
for(i in 1:nrow(PS4)){
PS4$tray.ID[i] <- strsplit(PS4$File[i], "_")[[1]][3]
}
length(unique(PS4$tray.ID))
## [1] 60
unique(PS4$Date)
## [1] 20250120 20250121 20250125 20250126 20250127 20250128 20250129 20250123
## [9] 20250122
## 9 Levels: 20250120 20250121 20250122 20250123 20250125 20250126 ... 20250129
Let’s transfer date and time into TOE.
for(i in 1:nrow(PS4)){
PS4$month <- substr(PS4$Date, 5, 6)
PS4$day <- substr(PS4$Date, 7, 8)
PS4$hour <- substr(PS4$Time, 1, 2)
}
PS4
Trays were loaded on Jan. 20th at around 13:00 and they were not imaged before 17:00
PS4$TOE <- (as.numeric(as.character(PS4$day)) - 20)*24 + (as.numeric(as.character(PS4$hour)) - 17)
unique(PS4$TOE)
## [1] 3 23 115 123 138 171 182 195 4 24 173 124 183 196 117 140 207 15 27
## [20] 174 184 28 141 17 125 20 136 60 185 209 118 39 187 144 40 145 146 175
## [39] 210 137 45 188 46 147 160 53 161 119 59
PS4
OK - then we have an issue with the FvFm being correct for one set of the data - and the other traits (FqFm and such) for other row. We need to correct it first:
# Get data containing right measurements into two separate datasets:
FvFm_data <- subset(PS4, PS4$Fv.Fm > 0)
notFvFm_data <- subset(PS4, PS4$Fv.Fm < 0)
# Get rid of collumns containing nonsense
FvFm_data <- FvFm_data[,c(1:5)]
notFvFm_data <- notFvFm_data[,c(1:4,6:23)]
FvFm_data
notFvFm_data
Now - let’s merge them together:
PS5 <- merge(FvFm_data, notFvFm_data, by =c("File", "Date", "Time", "Obj.Size"))
PS5
Before moving forward - let’s decode the data:
decode <- read.csv("20250120_SarahK__Batch 3_coding.csv")
decode
decode <- decode[,c(7,2,5:6)]
colnames(decode)[1] <- "tray.ID"
decode
OK cool cool - now let’s fuse it with the PS2 data based on the tray.ID
unique(PS5$tray.ID)
## [1] "39997" "39998" "39999" "40000" "40001" "40002" "40003" "40004" "40005"
## [10] "40006" "40007" "40008" "40009" "40010" "40011" "40012" "40013" "40014"
## [19] "40015" "40016" "40017" "40018" "40019" "40020" "40021" "40022" "40023"
## [28] "40024" "40025" "40026" "40027" "40028" "40029" "40030" "40031" "40032"
## [37] "40033" "40034" "40035" "40036" "40037" "40038" "40039" "40040" "40041"
## [46] "40042" "40043" "40044" "40045" "40046" "40047" "40048" "40049" "40050"
## [55] "40051" "40052" "40053" "40054" "40055" "40056"
PS6 <- merge(PS5, decode, by= "tray.ID", all=T)
PS6
Great! Lets have a look at how the data looks like now:
lgraph <- ggplot(data=PS6, aes(x= TOE, y=Fv.Fm, group = tray.ID))
lgraph <- lgraph + geom_line(alpha = 0.7)
lgraph <- lgraph + ylab("Maximum Quantum Yield (Fv/Fm)") + xlab("Hours of Imaging")
lgraph
lets add more info to the graph:
FvFm_graph <- ggplot(data=PS6, aes(x= TOE, y=Fv.Fm, group = tray.ID, color = TrayInfo))
FvFm_graph <- FvFm_graph + geom_line(alpha = 0.7)
FvFm_graph <- FvFm_graph + stat_summary(fun.data = mean_se, geom="ribbon", linetype=0, aes(group= TrayInfo), alpha=0.3)
FvFm_graph <- FvFm_graph + stat_summary(fun=mean, aes(group= TrayInfo), size=0.7, geom="line", linetype = "dashed")
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
FvFm_graph <- FvFm_graph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = TRUE)
FvFm_graph <- FvFm_graph + ylab("Fv/Fm (a.u.)") + xlab("Time of imaging (h)")
FvFm_graph
## Warning: Computation failed in `stat_compare_means()`
## Caused by error in `mutate()`:
## ℹ In argument: `p = purrr::map(...)`.
## Caused by error in `purrr::map()`:
## ℹ In index: 13.
## ℹ With name: x.183.
## Caused by error in `t.test.default()`:
## ! not enough 'y' observations
As you can see - there are some lines that are not exactly the same timepoints - so we will get in trouble when calculating averages. Therefore - we need to do splines!
So - let’s first isolate one plant to establish our spline calculations
max(PS6$TOE)
## [1] 210
hours <- seq(0, 210, by = 12)
hours
## [1] 0 12 24 36 48 60 72 84 96 108 120 132 144 156 168 180 192 204
length(hours)
## [1] 18
temp <- subset(PS6, PS6$tray.ID == unique(PS6$tray.ID)[1])
temp$TOE <- as.numeric(as.character(temp$TOE))
temp <- temp[order(temp$TOE, decreasing = F),]
temp$TOE
## [1] 3 23 115 123 138 171 182 195
Fv/Fm
plot.spl <- with(temp, smooth.spline(TOE, Fv.Fm, df = 8))
plot(Fv.Fm ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
Fq/Fm
plot.spl <- with(temp, smooth.spline(TOE, Fq..Fm., df = 8))
plot(Fq..Fm. ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
NPQ
plot.spl <- with(temp, smooth.spline(TOE, NPQ, df = 8))
plot(NPQ ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
qP
plot.spl <- with(temp, smooth.spline(TOE, qP, df = 8))
plot(qP ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
qN
plot.spl <- with(temp, smooth.spline(TOE, qN, df = 8))
plot(qN ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
qL
plot.spl <- with(temp, smooth.spline(TOE, qL, df = 8))
plot(qL ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
qE
plot.spl <- with(temp, smooth.spline(TOE, qE, df = 8))
plot(qE ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
qI
plot.spl <- with(temp, smooth.spline(TOE, qI, df = 8))
plot(qI ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
фno
plot.spl <- with(temp, smooth.spline(TOE, D.no, df = 8))
plot(D.no ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
фnpq
plot.spl <- with(temp, smooth.spline(TOE, D.npq, df = 8))
plot(D.npq ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
npq(t)
plot.spl <- with(temp, smooth.spline(TOE, npq.t., df = 8))
plot(npq.t. ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
ChlIdx
plot.spl <- with(temp, smooth.spline(TOE, ChlIdx, df = 8))
plot(ChlIdx ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
AriIdx
plot.spl <- with(temp, smooth.spline(TOE, AriIdx, df = 8))
plot(AriIdx ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
NDVI
plot.spl <- with(temp, smooth.spline(TOE, NDVI, df = 8))
plot(NDVI ~ TOE, data = temp)
lines(plot.spl, col = "blue")
lines(predict(plot.spl, hours), col = "red")
Then - let’s save all of the information into one file
PS6
# CHANGE last thing into trait name
names <- c(text = "tray.ID", "TOE", "Fv.Fm", "Fq.Fm", "NPQ", "qP", "qN", "qL", "qE", "qI", "phiNO", "phiNPQ", "npq.t", "ChlIdx", "AriIdx", "NDVI")
spline_data <- data.frame()
for (k in names) {
spline_data[[k]] <- as.character()}
pred_temp <- predict(plot.spl, hours)
length(pred_temp$x)
## [1] 18
spline_data[1:18,1] <- temp$tray.ID[1]
spline_data[1:18,2] <- pred_temp$x
plot.spl <- with(temp, smooth.spline(TOE, Fv.Fm, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,3] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, Fq..Fm., df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,4] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, NPQ, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,5] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qP, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,6] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qN, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,7] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qL, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,8] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qE, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,9] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qI, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,10] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, D.no, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,11] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, D.npq, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,12] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, npq.t., df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,13] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, ChlIdx, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,14] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, AriIdx, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,15] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, NDVI, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,16] <- pred_temp$y
final_spline <- spline_data
final_spline
all_plants <- unique(PS5$tray.ID)
all_plants
## [1] "39997" "39998" "39999" "40000" "40001" "40002" "40003" "40004" "40005"
## [10] "40006" "40007" "40008" "40009" "40010" "40011" "40012" "40013" "40014"
## [19] "40015" "40016" "40017" "40018" "40019" "40020" "40021" "40022" "40023"
## [28] "40024" "40025" "40026" "40027" "40028" "40029" "40030" "40031" "40032"
## [37] "40033" "40034" "40035" "40036" "40037" "40038" "40039" "40040" "40041"
## [46] "40042" "40043" "40044" "40045" "40046" "40047" "40048" "40049" "40050"
## [55] "40051" "40052" "40053" "40054" "40055" "40056"
for(i in 2:60){
temp <- subset(PS6, PS6$tray.ID == unique(PS6$tray.ID)[i])
if (dim(temp)[1] > 3) {
temp$TOE <- as.numeric(as.character(temp$TOE))
temp <- temp[order(temp$TOE, decreasing = F),]
spline_data[1:18,1] <- temp$tray.ID[1]
spline_data[1:18,2] <- hours
plot.spl <- with(temp, smooth.spline(TOE, Fv.Fm, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,3] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, Fq..Fm., df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,4] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, NPQ, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,5] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qP, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,6] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qN, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,7] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qL, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,8] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qE, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,9] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, qI, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,10] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, D.no, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,11] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, D.npq, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,12] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, npq.t., df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,13] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, ChlIdx, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,14] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, AriIdx, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,15] <- pred_temp$y
plot.spl <- with(temp, smooth.spline(TOE, NDVI, df = 8))
pred_temp <- predict(plot.spl, hours)
spline_data[1:18,16] <- pred_temp$y
final_spline <- rbind(final_spline, spline_data)
} else {
spline_data[1:18,1] <- temp$tray.ID[1]
spline_data[1:18,2] <- hours
spline_data[1:18,3] <- 0
spline_data[1:18,4] <- 0
spline_data[1:18,5] <- 0
spline_data[1:18,6] <- 0
spline_data[1:18,7] <- 0
spline_data[1:18,8] <- 0
spline_data[1:18,9] <- 0
spline_data[1:18,10] <- 0
spline_data[1:18,11] <- 0
spline_data[1:18,12] <- 0
spline_data[1:18,13] <- 0
spline_data[1:18,14] <- 0
spline_data[1:18,15] <- 0
spline_data[1:18,16] <- 0
final_spline <- rbind(final_spline, spline_data)
}}
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 6
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fv.Fm, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, Fq..Fm., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NPQ, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qP, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qN, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qL, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qE, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, qI, df = 8): not using invalid df; must have 1 <
## df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.no, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, D.npq, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, npq.t., df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, ChlIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, AriIdx, df = 8): not using invalid df; must have
## 1 < df <= n := #{unique x} = 7
## Warning in smooth.spline(TOE, NDVI, df = 8): not using invalid df; must have 1
## < df <= n := #{unique x} = 7
final_spline
Let’s change the collumns also to numeric - otherwise it will be tought to plot this:
final_spline2 <- final_spline
final_spline2[2:16] <- sapply(final_spline2[2:16],as.numeric)
final_spline2
Now - let’s decode all of the information into individual experiments and TrayInfos:
final_spline3 <- merge(final_spline2, decode, by = "tray.ID")
final_spline3
unique(final_spline3$TrayInfo)
## [1] "Control" "Drought"
unique(final_spline3$PlantID)
## [1] "Tray01_Control_A1_Vietnam" "Tray02_Control_A1_S.Africa"
## [3] "Tray03_Control_A1_Australia" "Tray04_Control_A1_Pakistan"
## [5] "Tray05_Control_A1_Texas" "Tray06_Control_A1_Mexico"
## [7] "Tray07_Drought_A1_Australia" "Tray08_Drought_A1_Texas"
## [9] "Tray09_Control_A1_Mexico" "Tray10_Control_A1_Pakistan"
## [11] "Tray11_Drought_A1_Vietnam" "Tray12_Control_A1_Texas"
## [13] "Tray13_Drought_A1_Mexico" "Tray14_Control_A1_Vietnam"
## [15] "Tray15_Drought_A1_Australia" "Tray16_Control_A1_S.Africa"
## [17] "Tray17_Drought_A1_Texas" "Tray18_Drought_A1_S.Africa"
## [19] "Tray19_Drought_A1_Pakistan" "Tray20_Drought_A1_Pakistan"
## [21] "Tray21_Drought_A1_S.Africa" "Tray22_Control_A1_Texas"
## [23] "Tray23_Control_A1_S.Africa" "Tray24_Drought_A1_Vietnam"
## [25] "Tray25_Control_A1_Australia" "Tray26_Control_A1_Pakistan"
## [27] "Tray27_Drought_A1_Australia" "Tray28_Drought_A1_Mexico"
## [29] "Tray29_Drought_A1_Pakistan" "Tray30_Drought_A1_Australia"
## [31] "Tray31_Control_A1_Vietnam" "Tray32_Drought_A1_Texas"
## [33] "Tray33_Drought_A1_S.Africa" "Tray34_Drought_A1_Vietnam"
## [35] "Tray35_Control_A1_Texas" "Tray36_Control_A1_Mexico"
## [37] "Tray37_Control_A1_Australia" "Tray38_Drought_A1_Pakistan"
## [39] "Tray39_Drought_A1_Mexico" "Tray40_Drought_A1_Vietnam"
## [41] "Tray41_Control_A1_Vietnam" "Tray42_Drought_A1_Texas"
## [43] "Tray43_Drought_A1_S.Africa" "Tray44_Control_A1_Australia"
## [45] "Tray45_Drought_A1_Pakistan" "Tray46_Drought_A1_Mexico"
## [47] "Tray47_Drought_A1_S.Africa" "Tray48_Drought_A1_Mexico"
## [49] "Tray49_Control_A1_Texas" "Tray50_Control_A1_Australia"
## [51] "Tray51_Control_A1_Pakistan" "Tray52_Control_A1_Mexico"
## [53] "Tray53_Drought_A1_Texas" "Tray54_Control_A1_S.Africa"
## [55] "Tray55_Control_A1_S.Africa" "Tray56_Drought_A1_Australia"
## [57] "Tray57_Control_A1_Vietnam" "Tray58_Control_A1_Mexico"
## [59] "Tray59_Control_A1_Pakistan" "Tray60_Drought_A1_Vietnam"
Fv/Fm
library(ggsci)
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = Fv.Fm, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "Fv/Fm (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Maximum Quantum Yield of Photosystem II")
C1_lgraph
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
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(cowplot)
##
## Attaching package: 'cowplot'
## The following object is masked from 'package:ggpubr':
##
## get_legend
get_p_value <- function(final_spline3) {
t.test(Fv.Fm ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## Warning: There was 1 warning in `summarise()`.
## ℹ In argument: `p_value = get_p_value(cur_data())`.
## ℹ In group 1: `TOE = 0` and `PlantName = "Australia"`.
## Caused by warning:
## ! `cur_data()` was deprecated in dplyr 1.1.0.
## ℹ Please use `pick()` instead.
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_FvFm.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
Fq/Fm
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = Fq.Fm, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "Fq'/Fm'") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Quantum Yield of Photosystem II in light adapted state")
get_p_value <- function(final_spline3) {
t.test(Fq.Fm ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_FqFm.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
NPQ
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = NPQ, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "NPQ (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Non-photochemical Quenching [(Fm-Fm’)/Fm’]")
get_p_value <- function(final_spline3) {
t.test(NPQ ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_NPQ.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [(Fm-Fm’)/Fm’]' in
## 'mbcsToSbcs': dot substituted for <99>
dev.off()
## quartz_off_screen
## 2
qP
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = qP, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "qP (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Fraction of Open Reaction Centers (puddle mode) / photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]")
get_p_value <- function(final_spline3) {
t.test(qP ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_qP.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (puddle mode) /
## photochemical quenching [(Fm’ – Fs’)/(Fm’ – F0’)]' in 'mbcsToSbcs': dot
## substituted for <99>
dev.off()
## quartz_off_screen
## 2
qN
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = qN, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "qN (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]")
get_p_value <- function(final_spline3) {
t.test(qN ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_qN.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <93>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Non-photochemical Quenching [1 – (Fm’ – F0’)/(Fm-F0)]'
## in 'mbcsToSbcs': dot substituted for <99>
dev.off()
## quartz_off_screen
## 2
qL
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = qL, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "qL (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Fraction of Open Reaction Centers (lake mode) / photochemical quenching (qP*F0’/Fs’)")
get_p_value <- function(final_spline3) {
t.test(qL ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_qL.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fraction of Open Reaction Centers (lake mode) /
## photochemical quenching (qP*F0’/Fs’)' in 'mbcsToSbcs': dot substituted for <99>
dev.off()
## quartz_off_screen
## 2
qE
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = qE, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "qE (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("fast relaxing component of NPQ (Fm*(Fm''-Fm’)/(Fm''*Fm’)")
get_p_value <- function(final_spline3) {
t.test(qE ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Removed 108 rows containing missing values (`geom_line()`).
pdf("Batch03_PS2_qE.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Removed 108 rows containing missing values (`geom_line()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'fast relaxing component of NPQ
## (Fm*(Fm''-Fm’)/(Fm''*Fm’)' in 'mbcsToSbcs': dot substituted for <99>
dev.off()
## quartz_off_screen
## 2
qI
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = qI, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "qI (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Slow relaxing component of NPQ [(Fm-Fm'')/Fm'']")
get_p_value <- function(final_spline3) {
t.test(qI ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_qI.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
PhiNO
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = phiNO, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "ɸNO (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Quantum Yield of non-regulated energy dissipation [1/(NPQ+1+qI*Fm/F0)]")
get_p_value <- function(final_spline3) {
t.test(phiNO ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_phiNO.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNO (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
dev.off()
## quartz_off_screen
## 2
PhiNPQ
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = phiNPQ, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "ɸNPQ (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Quantum Yield of NPQ (regulated energy dissipation) (1-Fq’/Fm’- ɸNO)")
get_p_value <- function(final_spline3) {
t.test(phiNPQ ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_phiNPQ.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Quantum Yield of NPQ (regulated energy dissipation)
## (1-Fq’/Fm’- ɸNO)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <c9>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'ɸNPQ (a.u.)' in 'mbcsToSbcs': dot substituted for <b8>
dev.off()
## quartz_off_screen
## 2
NPQ(t)
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = npq.t, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "NPQ(t) (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Fast NPQ 4.88/(Fm’/F0’-1)-1")
get_p_value <- function(final_spline3) {
# CHANGE
t.test(npq.t ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_NPQ(t).pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <e2>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <80>
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## conversion failure on 'Fast NPQ 4.88/(Fm’/F0’-1)-1' in 'mbcsToSbcs': dot
## substituted for <99>
dev.off()
## quartz_off_screen
## 2
ChlIdx
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = ChlIdx, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "ChlIdx (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Chlorophyll Index")
get_p_value <- function(final_spline3) {
t.test(ChlIdx ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_ChlIdx.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
AriIdx
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = AriIdx, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "AriIdx (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Anthocyanin Reflectance Index")
get_p_value <- function(final_spline3) {
t.test(AriIdx ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
# CHANGE
pdf("Batch03_PS2_AriIdx.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
NDVI
C1_lgraph <- ggplot(data = final_spline3, aes(x = TOE, y = NDVI, group = tray.ID, color = TrayInfo))
C1_lgraph <- C1_lgraph + geom_line(alpha = 0.1) + facet_wrap(~ PlantName, ncol = 6)
C1_lgraph <- C1_lgraph + stat_summary(fun.data = mean_se, geom = "ribbon", linetype = 0, aes(group = TrayInfo), alpha = 0.3)
C1_lgraph <- C1_lgraph + stat_summary(fun = mean, aes(group = TrayInfo), size = 0.7, geom = "line", linetype = "dashed")
C1_lgraph <- C1_lgraph + stat_compare_means(aes(group = TrayInfo), label = "p.signif", method = "t.test", hide.ns = F)
C1_lgraph <- C1_lgraph + labs(x = "", y = "NDVI (a.u.)") + scale_color_d3("category10") + theme(legend.position = "top") + ggtitle("Normalized Difference Vegetation Index")
get_p_value <- function(final_spline3) {
t.test(NDVI ~ TrayInfo, data = final_spline3)$p.value
}
p_values <- final_spline3 %>%
group_by(TOE, PlantName) %>%
summarise(p_value = get_p_value(cur_data())) %>%
ungroup()
## `summarise()` has grouped output by 'TOE'. You can override using the `.groups`
## argument.
p_values$LOD <- -log10(p_values$p_value)
C1_pplot <- ggplot(p_values, aes(x = TOE, y = LOD))
C1_pplot <- C1_pplot + geom_line() + geom_hline(yintercept = -log10(0.05), linetype = "dashed", color = "red") + facet_wrap(~ PlantName, ncol = 6)
C1_pplot <- C1_pplot + labs(x = "Hours Of Imaging", y = "-log10(p-value)")
C1_pplot <- C1_pplot + theme_minimal() + theme_bw() + theme(strip.text = element_blank(), strip.background = element_blank())
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
pdf("Batch03_PS2_NDVI.pdf", height = 5, width = 20)
plot_grid(C1_lgraph, C1_pplot, rel_heights = c(4,1), ncol = 1, align = "v", axis = "l")
## Warning: Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Computation failed in `stat_compare_means()`
## Caused by error in `purrr::map()`:
## ℹ In index: 1.
## Caused by error in `.check_npc_coord()`:
## ! '*.npc coord for x axis should be either a numeric value in [0-1] or a character strings including one of right, left, center, centre, middle
dev.off()
## quartz_off_screen
## 2
OK - that’s all - but just before we finish this - let’s save all of the data:
write.csv(final_spline3, "Batch.03.PS2.csv", row.names = F)