# Load all libraries and sources required to run the script
library(tidyverse)
library(ggthemes)
library(lmerTest)
library(emmeans)
library(multcomp)
library(gridExtra)
library(nlme)
library(lattice)
library(rms)
library(rstatix)
# Default ggplot settings
ggthe_bw<-theme_bw() + theme(panel.grid.major = element_blank(),
panel.grid.minor = element_blank(),
#panel.background = element_blank(),
axis.line = element_line(colour = "black"),
plot.background=element_blank(),
legend.title = element_blank(),
legend.box.background = element_rect(),
panel.background =element_rect(fill = NA, color = "white"),
legend.position="bottom",
strip.background =element_rect(fill=NA))
# Import data:
## Growth long
BW.Tall<-read.csv("Growth_corrected.csv", header = TRUE)
## Genotype information
MOTE<-read.csv("Genotype_Info.csv", header = TRUE)
BW.Tall<-merge(BW.Tall, MOTE, by="Gen", all.x=TRUE)
## Data type
BW.Tall$Initial.Date<-as.Date(BW.Tall$Initial.Date, "%m/%d/%y")
BW.Tall$Final.Date<-as.Date(BW.Tall$Final.Date, "%m/%d/%y")
BW.Tall$Days<-(as.numeric(as.Date(BW.Tall$Final.Date))-17485)
BW.Tall$DayF<-(as.factor(BW.Tall$Days))
BW.Tall$DayF<-factor(BW.Tall$DayF, levels = c("-28", "28", "62", "75", "91", "100"))
## corSymm requires consecutive integers
BW.Tall$TimePoint[BW.Tall$DayF=="-28"]<-"1"
#BW.Tall$TimePoint[BW.Tall$DayF=="-7"]<-"4"
BW.Tall$TimePoint[BW.Tall$DayF=="28"]<-"2"
BW.Tall$TimePoint[BW.Tall$DayF=="62"]<-"3"
BW.Tall$TimePoint[BW.Tall$DayF=="75"]<-"4"
BW.Tall$TimePoint[BW.Tall$DayF=="91"]<-"5"
BW.Tall$TimePoint[BW.Tall$DayF=="100"]<-"6"
BW.Tall$TimePoint[BW.Tall$DayF=="113"]<-"7"
BW.Tall$TimePoint<-as.numeric(BW.Tall$TimePoint)
BW.Tall$Treatment <- as.character(BW.Tall$Treatment)
BW.Tall$Treatment[BW.Tall$Treatment == "Control"] <- "Ambient"
BW.Tall$Treatment[BW.Tall$Treatment == "N"] <- "NH4"
BW.Tall$Treatment[BW.Tall$Treatment == "NP"] <- "NH4+PO4"
BW.Tall$Treatment <- as.factor(BW.Tall$Treatment)
BW.Tall$Nutrients <- "Nutrients"
BW.Tall$Nutrients[BW.Tall$Treatment == "Ambient"] <- "Ambient"
BW.Tall$Nutrients<-as.factor(BW.Tall$Nutrients)
BW.Tall$Nutrients2 <- BW.Tall$Nutrients
BW.Tall$Nutrients2[BW.Tall$DayF == "-28"] <- "Ambient"
BW.Tall$Nutrients2<-as.factor(BW.Tall$Nutrients2)
BW.Tall$Fra <- as.factor(BW.Tall$Fra)
#BW.Tall$Colony <- as.factor(BW.Tall$Gen)
BW.Tall$MoteGen<-factor(BW.Tall$MoteGen,
levels=c("G_48", "G_62","G_31", "G_08","G_07", "G_50"))
BW.Tall$SampleID <- paste("Ac", BW.Tall$Fra, BW.Tall$TimePoint, sep = "_")
# Remove unused columns
BW.Tall$Gen<-NULL
BW.Tall$Time <-NULL
BW.Tall$Period<-NULL
BW.Tall$Original.Collection.Date <-NULL
BW.Tall$Collection.Habitat <-NULL
BW.Tall$Lat <-NULL
BW.Tall$Lon <-NULL
BW.Tall$WBS <-NULL
# Remove recovery data points
BW.Tall<-subset(BW.Tall, Initial.Date!="2017-10-18")
BW.Tall<-subset(BW.Tall, Initial.Date!="2018-02-23") # After heat stress
Compare individual fragments inside each nutrient treatment
BW_ColonyT<- ggplot(BW.Tall, aes (Days, dAW.gd, colour=MoteGen, group=(Fra))) +
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar", width = 0.8)+
stat_summary(fun.y=mean, geom="point", size =2, alpha=0.5) +
ylab("Growth (mg/ g d)") +
annotate("segment", x = 2, xend = 91, y = -1, yend = -1,
colour = "gray90", linetype=1)+
annotate("segment", x = 79, xend = 91, y = -1, yend = -0.5,
colour = "gray90", linetype=1)+
annotate("segment", x = 91, xend = 110, y = -0.5, yend = -0.5,
colour = "gray90", linetype=1)+
annotate("text", x = 45, y = -1.5, label = "Nutrients", size=3)+
annotate("text", x = 99, y = -1.5, label = "H", size=3)+
stat_summary(fun.y=mean, geom="line") + ggthe_bw + facet_grid (~Treatment)
BW_ColonyT+ facet_grid(Treatment~MoteGen)
Fragments measured per time point and genotype
N.fragments<-BW.Tall %>%
group_by(MoteGen) %>% dplyr::count(DayF)
N.fragments
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#469B53", "#AA4A74"))
# Treatment effect over time
BW_Treat<- ggplot(BW.Tall, aes (Days, dAW.gd, fill=Treatment, shape=factor(Treatment))) + Fill.colour+
scale_shape_manual(values=c(21, 22, 24),
labels=c("Ambient", "NH4", "NH4+PO4"))+
ggthe_bw + ggtitle("a. overall growth by treatment \n")+
stat_summary(fun.data = "mean_cl_boot", geom = "errorbar",
position=position_dodge(width=5))+
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
stat_summary(fun.y=mean, geom="point", size =2, alpha=0.8,
position=position_dodge(width=5)) +
scale_x_continuous(name="Days in the experiment",
breaks = seq(-30, 115, by=15)) +
scale_y_continuous(name=("Growth (mg g-1 d-1) "),
limits = c(-1.8,5),
breaks = seq(-1, 5, 1),
expand = c(0, 0))+
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray35")+
annotate("text", x = -16, y = -1.2, label = "Baseline", size=3)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray35", linetype="dashed")+
annotate("text", x = 45, y = -1.2, label = "Nutrients", size=3)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = 3.5,
colour = "gray35", linetype="dotted")+
annotate("segment", x = 91, xend = 110, y = 3.5, yend = 3.5,
colour = "gray35", linetype="dotted")+
annotate("text", x = 99, y = -1.2, label = "Heat", size=3)+
theme(legend.position = c(0.2,0.25))
BW_Treat
# ggsave(file="Outputs/Figure3_BW_ICRS.svg", plot=BW_Treat, dpi = 300, units="in", width=5, height=4)
# Linear model
Model_treatment<-lmer(dAW.gd~Treatment * DayF + (1|Genotype) + (1|Fra) + (1|Replicate),
data = BW.Tall)
anova(Model_treatment)
ranova(Model_treatment)
#summary(Model_treatment)
# Pairwise comparisons
# Day specific comparisons
BW.emmc<-emmeans(Model_treatment, ~Treatment|DayF)
BW_groups<-cld(BW.emmc)
BW_groups
# Across days (temperature) comparisons
BW.emmc<-emmeans(Model_treatment, ~Treatment*DayF)
BW_groups<-cld(BW.emmc)
BW_groups<-BW_groups[order(BW_groups$DayF,BW_groups$Treatment),]
BW_groups
summary(BW.Tall)
## Fra Treatment Replicate Initial.Date
## 102 : 6 Ambient:218 R1:328 Min. :2017-08-30
## 105 : 6 NH4 :197 R2:288 1st Qu.:2017-11-16
## 108 : 6 NH4+PO4:201 Median :2017-12-15
## 116 : 6 Mean :2017-12-07
## 117 : 6 3rd Qu.:2018-01-16
## 118 : 6 Max. :2018-02-14
## (Other):580
## Final.Date dBW.g dAW.gd MoteGen
## Min. :2017-10-18 Min. :-1.666 Min. :-1.482 G_48:156
## 1st Qu.:2017-12-13 1st Qu.: 1.333 1st Qu.: 1.364 G_62:158
## Median :2018-01-16 Median : 2.379 Median : 2.389 G_31: 83
## Mean :2018-01-02 Mean : 2.364 Mean : 2.381 G_08: 36
## 3rd Qu.:2018-01-29 3rd Qu.: 3.384 3rd Qu.: 3.413 G_07:124
## Max. :2018-02-23 Max. : 6.958 Max. : 7.022 G_50: 59
## NA's :1 NA's :1
## Genotype WB Days DayF TimePoint
## Green and Orange:158 R: 83 Min. :-28.00 -28:118 Min. :1.000
## Green :156 S:533 1st Qu.: 28.00 28 :119 1st Qu.:2.000
## Red and Orange :124 Median : 62.00 62 :118 Median :3.000
## Orange : 83 Mean : 48.41 75 :115 Mean :3.187
## Red and Yellow : 59 3rd Qu.: 75.00 91 : 83 3rd Qu.:4.000
## Yellow : 36 Max. :100.00 100: 63 Max. :6.000
## (Other) : 0
## Nutrients Nutrients2 SampleID
## Ambient :218 Ambient :297 Length:616
## Nutrients:398 Nutrients:319 Class :character
## Mode :character
##
##
##
##
# Sample means
BW.mean <- aggregate(dAW.gd~Treatment+Days, data=BW.Tall, mean, na.rm=TRUE)
names(BW.mean)[3] <- "mean"
# sample SDs
BW.sd <- aggregate(dAW.gd~Treatment+Days, data=BW.Tall, sd, na.rm=TRUE)
names(BW.sd)[3] <- "sd"
# Collect the summary statistics in a dataframe
BW.summaries <- merge(BW.mean, BW.sd)
print(BW.summaries, digits=3)
## Treatment Days mean sd
## 1 Ambient -28 3.593 0.617
## 2 Ambient 100 1.672 0.517
## 3 Ambient 28 3.700 0.809
## 4 Ambient 62 3.588 1.093
## 5 Ambient 75 3.436 0.994
## 6 Ambient 91 2.409 0.724
## 7 NH4 -28 3.719 1.182
## 8 NH4 100 -0.373 0.520
## 9 NH4 28 2.660 0.615
## 10 NH4 62 1.707 0.934
## 11 NH4 75 1.055 0.848
## 12 NH4 91 0.650 0.552
## 13 NH4+PO4 -28 3.608 1.044
## 14 NH4+PO4 100 -0.465 0.443
## 15 NH4+PO4 28 3.078 1.069
## 16 NH4+PO4 62 1.749 0.911
## 17 NH4+PO4 75 1.321 0.833
## 18 NH4+PO4 91 1.096 0.694
# sample means
BW.mean1 <- aggregate(dAW.gd~Treatment+Days+MoteGen, data=BW.Tall, mean, na.rm=TRUE)
names(BW.mean1)[4] <- "mean"
# sample SDs
BW.sd1 <- aggregate(dAW.gd~Treatment+Days+MoteGen, data=BW.Tall, sd, na.rm=TRUE)
names(BW.sd1)[4] <- "sd"
# Collect the summary statistics in a dataframe
BW.summaries1<-merge(BW.mean1, BW.sd1)
BW.summaries1<-BW.summaries1[order(BW.summaries1$MoteGen,BW.summaries1$Day),]
BW.summaries1
BW.Tall$Treatment2 <- "Nutrients"
BW.Tall$Treatment2[BW.Tall$Treatment=="Ambient"] <- "Ambient"
BW.Tall$Treatment2<-as.factor(BW.Tall$Treatment2)
summary (BW.Tall$Treatment2)
## Ambient Nutrients
## 218 398
Figure.3<-grid.arrange(BW_Treat, Fig3b,
ncol = 2, widths = c(1.1,2))
#ggsave(file="Outputs/Figure3ab.svg", plot=Figure.3, width=7.5, height=4.5)
Colour.colour<-scale_colour_manual(values = c ("#4A6CAA", "#b45274"))
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#b45274"))
BW_Col <- ggplot(BW.Tall, aes(Days, dAW.gd, fill=Treatment2,
shape=factor(Treatment2))) +
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray90", linetype=1)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray35", linetype=2)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = 4.5,
colour = "gray35", linetype=3)+
annotate("segment", x = 91, xend = 110, y = 4.5, yend = 4.5,
colour = "gray35", linetype=3)+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar",
position=position_dodge(width=5), width = 10)+
stat_summary(fun.y=mean, geom="point", size =2,
position=position_dodge(width=5), alpha=0.8) +
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
scale_shape_manual(values=c(21, 14),
labels=c("A", "N+P"))+
ggthe_bw + Colour.colour + Fill.colour +
scale_x_continuous(name="Days in the experiment",
limits = c(-35,113),
breaks = seq(0, 113, 30),
expand = c(0, 0))+
scale_y_continuous(name="Growth rate (mg g-1 d-1) ",
breaks = seq(-1, 5, by=1)) +
#geom_hline(yintercept = 0, linetype=3)+
theme(text=element_text(size=14),
legend.position="none",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
facet_wrap(~MoteGen)
BW_Col
# Linear model
Model_genotype<-lmer(dAW.gd~MoteGen * Treatment2 *DayF +
(1|Fra) + (1|Replicate),
data = BW.Tall)
anova(Model_genotype)
ranova(Model_genotype)
#summary(Model_genotype)
# Pairwise comparisons
# Day specific comparisons
BW.emmc<-emmeans(Model_genotype, ~Treatment2|DayF)
BW_groups<-cld(BW.emmc)
BW_groups
# Across days (temperature) comparisons
BW.emmc<-emmeans(Model_genotype, ~Treatment2*DayF)
BW_groups<-cld(BW.emmc)
BW_groups<-BW_groups[order(BW_groups$DayF,BW_groups$Treatment),]
BW_groups
# genets comparisons
BW.emmc<-emmeans(Model_genotype, ~Treatment2*DayF*MoteGen)
BW_groups<-cld(BW.emmc)
BW_groups<-BW_groups[order(BW_groups$DayF,
BW_groups$Treatment2,
BW_groups$MoteGen),]
BW_groups
#write.csv(BW_groups, "Outputs/genotype_growth.csv", row.names = F)
# sample means
BW.mean2 <- aggregate(dAW.gd~Treatment2+Days+MoteGen, data=BW.Tall, mean, na.rm=TRUE)
names(BW.mean2)[4] <- "mean"
# sample SDs
BW.sd2 <- aggregate(dAW.gd~Treatment2+Days+MoteGen, data=BW.Tall, sd, na.rm=TRUE)
names(BW.sd2)[4] <- "sd"
# Collect the summary statistics in a dataframe
BW.summaries2<-merge(BW.mean2, BW.sd2)
BW.summaries2<-BW.summaries2[order(BW.summaries2$MoteGen,BW.summaries2$Day),]
BW.summaries2
# Calculate relative changes (1 - Ambient)
BW.Tall$Nutrients2<-BW.Tall$Nutrients
BW.Tall$Nutrients2[BW.Tall$DayF=="-28"]<-"Ambient"
BW.Summary <-BW.Tall %>%
group_by(MoteGen, Nutrients2, DayF) %>%
get_summary_stats(dAW.gd, type = "mean_sd")
BW.Summary
BW.Summary<-subset(BW.Summary, Nutrients2=="Ambient" )
BW.Summary<-BW.Summary[, -3]
BW.Summary<-BW.Summary[, -3]
BW.Summary<-BW.Summary[, -3]
names(BW.Summary)[3] <- "A_Mean"
BW.Tall<-merge(BW.Tall, BW.Summary, by=c("MoteGen", "DayF"), all.x = T)
BW.Tall$Difference<-BW.Tall$dAW.gd-BW.Tall$A_Mean
Colour.colour<-scale_colour_manual(values = c ("#4A6CAA", "#b45274"))
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#b45274"))
BW_Diff_Col <- ggplot(BW.Tall, aes(Days, Difference, fill=Nutrients2,
shape=factor(Nutrients2))) +
annotate("segment", x = -30, xend = 0, y = -3.5, yend = -3.5,
colour = "gray35", linetype = 1)+
annotate("segment", x = 2, xend = 91, y = -3.5, yend = -3.5,
colour = "gray35", linetype = "dashed")+
annotate("segment", x = 79, xend = 91, y = -3.5, yend = 1,
colour = "gray35", linetype = "dotted")+
annotate("segment", x = 91, xend = 110, y =1, yend =1,
colour = "gray35", linetype = "dotted")+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar",
position=position_dodge(width=5), width = 10)+
stat_summary(fun.y=mean, geom="point", size =2,
position=position_dodge(width=5), alpha=0.8) +
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
ggthe_bw + Colour.colour + Fill.colour +
scale_x_continuous(name="Days in the experiment",
limits = c(-35,113),
breaks = seq(0, 113, 30),
expand = c(0, 0))+
scale_y_continuous(name="Difference in growth (mg g-1 d-1) respecto to ambient",
breaks = seq(-4, 1.5, by=1)) +
theme(legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
facet_wrap(~MoteGen)
BW_Diff_Col
#ggsave(file="Outputs/S_3_BW_Diff_Col.svg", plot=BW_Diff_Col, width=5.0, height=5)
# Calculate percentages changes (1 - Control)
BW.Tall$percentage<-(BW.Tall$Difference/BW.Tall$A_Mean)*100
Colour.colour<-scale_colour_manual(values = c ("#4A6CAA", "#b45274"))
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#b45274"))
BW_perent_Col <- ggplot(BW.Tall, aes(Days, percentage, fill=Nutrients2,
shape=factor(Nutrients2))) +
annotate("segment", x = -30, xend = 0, y = -140, yend = -140,
colour = "gray35", linetype = 1)+
annotate("segment", x = 2, xend = 91, y = -140, yend = -140,
colour = "gray35", linetype = "dashed")+
annotate("segment", x = 79, xend = 91, y = -139, yend = 28,
colour = "gray35", linetype = "dotted")+
annotate("segment", x = 91, xend = 110, y = 28, yend =28,
colour = "gray35", linetype = "dotted")+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar",
position=position_dodge(width=5), width = 10)+
stat_summary(fun.y=mean, geom="point", size =2,
position=position_dodge(width=5), alpha=0.8) +
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
ggthe_bw + Colour.colour + Fill.colour +
scale_x_continuous(name="Days in the experiment",
limits = c(-35,113),
breaks = seq(0, 113, 30),
expand = c(0, 0))+
scale_y_continuous(name="Percentage of growth change respecto to ambient",
breaks = seq(-140, 100, by=20)) +
theme(legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
facet_wrap(~MoteGen)
BW_perent_Col
#ggsave(file="Outputs/S_3_BW_Percentaje_Col.svg", plot=BW_perent_Col, width=5.0, height=5)
# Calculate relative changes (mean per treatment - genotype per treatment)
BW.Summary2 <-BW.Tall %>%
group_by(Nutrients2, DayF) %>%
get_summary_stats(dAW.gd, type = "mean_sd")
BW.Summary2
BW.Summary2<-BW.Summary2[, -3]
BW.Summary2<-BW.Summary2[, -3]
BW.Summary2<-BW.Summary2[, -4]
BW.Tall<-merge(BW.Tall, BW.Summary2, by=c("Nutrients2", "DayF"), all.x = T)
BW.Tall$Difference2<-BW.Tall$dAW.gd-BW.Tall$mean
Colour.colour<-scale_colour_manual(values = c ("#4A6CAA", "#b45274"))
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#b45274"))
BW_Diff_Col2 <- ggplot(BW.Tall, aes(Days, Difference2, fill=Nutrients2,
shape=factor(Nutrients2))) +
annotate("segment", x = -30, xend = 0, y = -2.5, yend = -2.5,
colour = "gray35", linetype = 1)+
annotate("segment", x = 2, xend = 91, y = -2.5, yend = -2.5,
colour = "gray35", linetype = "dashed")+
annotate("segment", x = 79, xend = 91, y = -2.5, yend = 1.5,
colour = "gray35", linetype = "dotted")+
annotate("segment", x = 91, xend = 110, y =1.5, yend =1.5,
colour = "gray35", linetype = "dotted")+
annotate("segment", x = -30, xend = 110, y = 0, yend = 0,
colour = "gray90", linetype = 1)+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar",
position=position_dodge(width=5), width = 10)+
stat_summary(fun.y=mean, geom="point", size =2,
position=position_dodge(width=5), alpha=0.8) +
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
ggthe_bw + Colour.colour + Fill.colour +
scale_x_continuous(name="Days in the experiment",
limits = c(-35,113),
breaks = seq(0, 113, 30),
expand = c(0, 0))+
scale_y_continuous(name="Difference in growth (mg g-1 d-1) respecto to mean treatment",
breaks = seq(-4, 1.5, by=1)) +
theme(text=element_text(size=12),
legend.position="bottom",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
facet_wrap(~MoteGen)
BW_Diff_Col2
#ggsave(file="Outputs/S_3_BW_Diff_Col.svg", plot=BW_Diff_Col, width=5.0, height=5)
# Calculate percentages changes (1 - Control)
BW.Tall$percentage2<-(BW.Tall$Difference2/BW.Tall$mean)*100
Colour.colour<-scale_colour_manual(values = c ("#4A6CAA", "#b45274"))
Fill.colour<-scale_fill_manual(values = c ("#4A6CAA", "#b45274"))
BW_perent_Col3 <- ggplot(BW.Tall, aes(Days, percentage2, fill=Nutrients2,
shape=factor(Nutrients2))) +
annotate("segment", x = -30, xend = 0, y = -140, yend = -140,
colour = "gray35", linetype = 1)+
annotate("segment", x = 2, xend = 91, y = -140, yend = -140,
colour = "gray35", linetype = "dashed")+
annotate("segment", x = 79, xend = 91, y = -139, yend = 28,
colour = "gray35", linetype = "dotted")+
annotate("segment", x = 91, xend = 110, y = 28, yend =28,
colour = "gray35", linetype = "dotted")+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar",
position=position_dodge(width=5), width = 10)+
stat_summary(fun.y=mean, geom="point", size =2,
position=position_dodge(width=5), alpha=0.8) +
stat_summary(fun.y=mean, geom="line",
position=position_dodge(width=5), linetype=1) +
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
ggthe_bw + Colour.colour + Fill.colour +
scale_x_continuous(name="Days in the experiment",
limits = c(-35,113),
breaks = seq(0, 113, 30),
expand = c(0, 0))+
scale_y_continuous(name="Percentage of growth change respecto to ambient",
breaks = seq(-140, 100, by=20)) +
theme(text=element_text(size=12),
legend.position="bottom",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
facet_wrap(~MoteGen)
BW_perent_Col3
#ggsave(file="Outputs/S_3_BW_Percentaje_Col.svg", plot=BW_perent_Col, width=5.0, height=5)
summary(BW.Tall$DayF)
## -28 28 62 75 91 100
## 118 119 118 115 83 63
BW.Acer_28<-subset(BW.Tall, DayF=="-28")
BW.Acer75<-subset(BW.Tall, DayF=="75")
BW.Acer92<-subset(BW.Tall, DayF=="91")
BW.Acer110<-subset(BW.Tall, DayF=="100")
BW.AcerTimePoints<-rbind(BW.Acer_28, BW.Acer75, BW.Acer92, BW.Acer110)
BW_Timepoints<- ggplot(BW.AcerTimePoints, aes (DayF, dAW.gd, fill=MoteGen, shape=Nutrients2)) +
#ggtitle("(a) Baseline")+
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar", width = 0.2) +
stat_summary(fun.y=mean, geom="point", size =3, alpha=0.9) + ggthe_bw +
scale_y_continuous(name=("Growth (mg/ g d) "),
limits = c(-1,6),
breaks = seq(-1, 6, by=1))+
theme(legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA))+
facet_grid(~MoteGen)
BW_Timepoints
BW_Timepoints<- ggplot(BW.AcerTimePoints, aes (MoteGen, dAW.gd, fill=MoteGen, shape=Nutrients2)) +
#ggtitle("(a) Baseline")+
scale_shape_manual(values=c(21, 14),
labels=c("A", "N and N+P"))+
stat_summary(fun.y=mean, geom="point", size =3, alpha=0.9) + ggthe_bw +
stat_summary(fun.data = "mean_cl_boot",geom = "errorbar", width = 0.2) +
scale_y_continuous(name=("Growth (mg/ g d) "),
limits = c(-1,6),
breaks = seq(-1, 6, by=1))+
theme(legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA))+
facet_grid(~DayF)
BW_Timepoints
#ggsave(file="Outputs/S4_YII_Treat_Colo.svg", plot=BW_Timepoints, width=5.5, height=3)
A_data<-subset(BW.Tall, Treatment=="Ambient")
fit1 <- gls(dAW.gd ~ DayF *MoteGen, data=A_data,
correlation=corSymm(form=~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"))
Only Ambient summary model
summary(fit1)
## Generalized least squares fit by REML
## Model: dAW.gd ~ DayF * MoteGen
## Data: A_data
## AIC BIC logLik
## 322.6973 505.3257 -104.3486
##
## Correlation Structure: General
## Formula: ~TimePoint | Fra
## Parameter estimate(s):
## Correlation:
## 1 2 3 4 5
## 2 0.711
## 3 0.140 0.507
## 4 0.360 0.694 0.899
## 5 0.140 0.416 0.881 0.852
## 6 -0.088 0.089 0.547 0.463 0.628
## Variance function:
## Structure: Different standard deviations per stratum
## Formula: ~1 | TimePoint
## Parameter estimates:
## 1 6 2 3 4 5
## 1.0000000 0.6822319 1.0417524 1.4399075 1.2123007 0.8848347
##
## Coefficients:
## Value Std.Error t-value p-value
## (Intercept) 3.1437100 0.1753609 17.927084 0.0000
## DayF28 0.5924100 0.1362675 4.347405 0.0000
## DayF62 1.0314200 0.2864872 3.600231 0.0004
## DayF75 0.9914100 0.2216242 4.473384 0.0000
## DayF91 -0.2597367 0.2196767 -1.182359 0.2386
## DayF100 -1.4058051 0.2260159 -6.219939 0.0000
## MoteGenG_62 0.3800567 0.2547935 1.491626 0.1375
## MoteGenG_31 0.8996500 0.3037340 2.961966 0.0035
## MoteGenG_08 0.2482900 0.4295448 0.578031 0.5640
## MoteGenG_07 0.5887122 0.2547935 2.310546 0.0220
## MoteGenG_50 0.9485650 0.3280702 2.891347 0.0043
## DayF28:MoteGenG_62 -0.4235555 0.2007880 -2.109466 0.0363
## DayF62:MoteGenG_62 -0.7179756 0.4162562 -1.724840 0.0863
## DayF75:MoteGenG_62 -0.6534878 0.3220125 -2.029387 0.0439
## DayF91:MoteGenG_62 -0.4612887 0.3194581 -1.443973 0.1505
## DayF100:MoteGenG_62 -0.5638182 0.3289567 -1.713959 0.0882
## DayF28:MoteGenG_31 0.1570700 0.2360222 0.665488 0.5066
## DayF62:MoteGenG_31 -0.4347000 0.4962104 -0.876040 0.3822
## DayF75:MoteGenG_31 -0.9353900 0.3838643 -2.436772 0.0158
## DayF91:MoteGenG_31 -0.6388149 0.3804912 -1.678922 0.0949
## DayF100:MoteGenG_31 -0.0471744 0.3914710 -0.120505 0.9042
## DayF28:MoteGenG_08 -2.0092100 0.3337859 -6.019458 0.0000
## DayF62:MoteGenG_08 -2.3328200 0.7017474 -3.324301 0.0011
## DayF75:MoteGenG_08 -2.3208600 0.5428662 -4.275197 0.0000
## DayF91:MoteGenG_08 -1.7505633 0.5330824 -3.283851 0.0012
## DayF100:MoteGenG_08 0.0197551 0.5431044 0.036374 0.9710
## DayF28:MoteGenG_07 -1.0527322 0.1979921 -5.317042 0.0000
## DayF62:MoteGenG_07 -2.1614192 0.4176057 -5.175741 0.0000
## DayF75:MoteGenG_07 -2.2335656 0.3220125 -6.936270 0.0000
## DayF91:MoteGenG_07 -1.5475788 0.3194624 -4.844323 0.0000
## DayF100:MoteGenG_07 -1.1130825 0.3289572 -3.383670 0.0009
## DayF28:MoteGenG_50 -0.7766850 0.2549332 -3.046622 0.0027
## DayF62:MoteGenG_50 -2.1858450 0.5359685 -4.078309 0.0001
## DayF75:MoteGenG_50 -2.3643350 0.4146209 -5.702402 0.0000
## DayF91:MoteGenG_50 -2.1602133 0.4076976 -5.298568 0.0000
## DayF100:MoteGenG_50 -1.0834199 0.4159601 -2.604625 0.0100
##
## Correlation:
## (Intr) DayF28 DayF62 DayF75 DayF91 DyF100 MGG_62 MGG_31
## DayF28 -0.334
## DayF62 -0.488 0.643
## DayF75 -0.446 0.713 0.935
## DayF91 -0.699 0.532 0.877 0.855
## DayF100 -0.823 0.383 0.663 0.618 0.826
## MoteGenG_62 -0.688 0.230 0.336 0.307 0.481 0.566
## MoteGenG_31 -0.577 0.193 0.282 0.258 0.404 0.475 0.397
## MoteGenG_08 -0.408 0.136 0.199 0.182 0.285 0.336 0.281 0.236
## MoteGenG_07 -0.688 0.230 0.336 0.307 0.481 0.566 0.474 0.397
## MoteGenG_50 -0.535 0.178 0.261 0.238 0.374 0.440 0.368 0.309
## DayF28:MoteGenG_62 0.226 -0.679 -0.437 -0.484 -0.361 -0.260 -0.329 -0.131
## DayF62:MoteGenG_62 0.336 -0.443 -0.688 -0.644 -0.604 -0.456 -0.488 -0.194
## DayF75:MoteGenG_62 0.307 -0.490 -0.644 -0.688 -0.588 -0.426 -0.446 -0.177
## DayF91:MoteGenG_62 0.481 -0.366 -0.603 -0.588 -0.688 -0.568 -0.698 -0.278
## DayF100:MoteGenG_62 0.565 -0.263 -0.455 -0.425 -0.567 -0.687 -0.821 -0.326
## DayF28:MoteGenG_31 0.193 -0.577 -0.372 -0.411 -0.307 -0.221 -0.133 -0.334
## DayF62:MoteGenG_31 0.282 -0.372 -0.577 -0.540 -0.507 -0.383 -0.194 -0.488
## DayF75:MoteGenG_31 0.258 -0.411 -0.540 -0.577 -0.494 -0.357 -0.177 -0.446
## DayF91:MoteGenG_31 0.404 -0.307 -0.507 -0.494 -0.577 -0.477 -0.278 -0.699
## DayF100:MoteGenG_31 0.475 -0.221 -0.383 -0.357 -0.477 -0.577 -0.327 -0.823
## DayF28:MoteGenG_08 0.136 -0.408 -0.263 -0.291 -0.217 -0.156 -0.094 -0.079
## DayF62:MoteGenG_08 0.199 -0.263 -0.408 -0.382 -0.358 -0.270 -0.137 -0.115
## DayF75:MoteGenG_08 0.182 -0.291 -0.382 -0.408 -0.349 -0.252 -0.125 -0.105
## DayF91:MoteGenG_08 0.288 -0.219 -0.362 -0.352 -0.412 -0.340 -0.198 -0.166
## DayF100:MoteGenG_08 0.342 -0.159 -0.276 -0.257 -0.344 -0.416 -0.236 -0.198
## DayF28:MoteGenG_07 0.230 -0.688 -0.443 -0.490 -0.366 -0.263 -0.158 -0.133
## DayF62:MoteGenG_07 0.335 -0.441 -0.686 -0.642 -0.602 -0.455 -0.231 -0.193
## DayF75:MoteGenG_07 0.307 -0.490 -0.644 -0.688 -0.588 -0.426 -0.211 -0.177
## DayF91:MoteGenG_07 0.481 -0.366 -0.603 -0.588 -0.688 -0.568 -0.331 -0.278
## DayF100:MoteGenG_07 0.565 -0.263 -0.455 -0.425 -0.567 -0.687 -0.389 -0.326
## DayF28:MoteGenG_50 0.178 -0.535 -0.344 -0.381 -0.285 -0.204 -0.123 -0.103
## DayF62:MoteGenG_50 0.261 -0.344 -0.535 -0.500 -0.469 -0.354 -0.180 -0.151
## DayF75:MoteGenG_50 0.238 -0.381 -0.500 -0.535 -0.457 -0.330 -0.164 -0.138
## DayF91:MoteGenG_50 0.377 -0.287 -0.473 -0.461 -0.539 -0.445 -0.259 -0.217
## DayF100:MoteGenG_50 0.447 -0.208 -0.360 -0.336 -0.449 -0.543 -0.308 -0.258
## MGG_08 MGG_07 MGG_50 DF28:MGG_6 DF62:MGG_6 DF75:MGG_6
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07 0.281
## MoteGenG_50 0.218 0.368
## DayF28:MoteGenG_62 -0.092 -0.156 -0.121
## DayF62:MoteGenG_62 -0.137 -0.231 -0.180 0.635
## DayF75:MoteGenG_62 -0.125 -0.211 -0.164 0.703 0.935
## DayF91:MoteGenG_62 -0.196 -0.331 -0.257 0.526 0.877 0.854
## DayF100:MoteGenG_62 -0.231 -0.389 -0.302 0.378 0.661 0.617
## DayF28:MoteGenG_31 -0.079 -0.133 -0.103 0.392 0.256 0.283
## DayF62:MoteGenG_31 -0.115 -0.194 -0.151 0.252 0.397 0.372
## DayF75:MoteGenG_31 -0.105 -0.177 -0.138 0.279 0.372 0.397
## DayF91:MoteGenG_31 -0.165 -0.278 -0.216 0.209 0.349 0.340
## DayF100:MoteGenG_31 -0.194 -0.327 -0.254 0.150 0.263 0.246
## DayF28:MoteGenG_08 -0.334 -0.094 -0.073 0.277 0.181 0.200
## DayF62:MoteGenG_08 -0.488 -0.137 -0.107 0.178 0.281 0.263
## DayF75:MoteGenG_08 -0.446 -0.125 -0.097 0.197 0.263 0.281
## DayF91:MoteGenG_08 -0.706 -0.198 -0.154 0.149 0.249 0.243
## DayF100:MoteGenG_08 -0.839 -0.236 -0.183 0.108 0.190 0.177
## DayF28:MoteGenG_07 -0.094 -0.334 -0.123 0.467 0.305 0.338
## DayF62:MoteGenG_07 -0.137 -0.487 -0.179 0.300 0.472 0.442
## DayF75:MoteGenG_07 -0.125 -0.446 -0.164 0.333 0.443 0.474
## DayF91:MoteGenG_07 -0.196 -0.698 -0.257 0.248 0.415 0.405
## DayF100:MoteGenG_07 -0.231 -0.821 -0.302 0.178 0.313 0.292
## DayF28:MoteGenG_50 -0.073 -0.123 -0.334 0.363 0.237 0.262
## DayF62:MoteGenG_50 -0.107 -0.180 -0.488 0.233 0.368 0.344
## DayF75:MoteGenG_50 -0.097 -0.164 -0.446 0.259 0.344 0.368
## DayF91:MoteGenG_50 -0.154 -0.259 -0.705 0.195 0.325 0.317
## DayF100:MoteGenG_50 -0.182 -0.308 -0.836 0.141 0.248 0.231
## DF91:MGG_6 DF100:MGG_6 DF28:MGG_3 DF62:MGG_3 DF75:MGG_3
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07
## MoteGenG_50
## DayF28:MoteGenG_62
## DayF62:MoteGenG_62
## DayF75:MoteGenG_62
## DayF91:MoteGenG_62
## DayF100:MoteGenG_62 0.825
## DayF28:MoteGenG_31 0.211 0.152
## DayF62:MoteGenG_31 0.348 0.263 0.643
## DayF75:MoteGenG_31 0.339 0.245 0.713 0.935
## DayF91:MoteGenG_31 0.397 0.328 0.532 0.877 0.855
## DayF100:MoteGenG_31 0.328 0.397 0.383 0.663 0.618
## DayF28:MoteGenG_08 0.149 0.107 0.236 0.152 0.168
## DayF62:MoteGenG_08 0.246 0.186 0.152 0.236 0.220
## DayF75:MoteGenG_08 0.240 0.173 0.168 0.220 0.236
## DayF91:MoteGenG_08 0.283 0.234 0.127 0.209 0.203
## DayF100:MoteGenG_08 0.236 0.286 0.092 0.159 0.149
## DayF28:MoteGenG_07 0.252 0.181 0.397 0.256 0.283
## DayF62:MoteGenG_07 0.414 0.312 0.255 0.396 0.370
## DayF75:MoteGenG_07 0.405 0.292 0.283 0.372 0.397
## DayF91:MoteGenG_07 0.473 0.390 0.211 0.348 0.339
## DayF100:MoteGenG_07 0.390 0.472 0.152 0.263 0.245
## DayF28:MoteGenG_50 0.196 0.140 0.309 0.199 0.220
## DayF62:MoteGenG_50 0.323 0.243 0.199 0.309 0.289
## DayF75:MoteGenG_50 0.314 0.227 0.220 0.289 0.309
## DayF91:MoteGenG_50 0.371 0.306 0.166 0.273 0.266
## DayF100:MoteGenG_50 0.309 0.373 0.120 0.208 0.194
## DF91:MGG_3 DF100:MGG_3 DF28:MGG_08 DF62:MGG_08 DF75:MGG_08
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07
## MoteGenG_50
## DayF28:MoteGenG_62
## DayF62:MoteGenG_62
## DayF75:MoteGenG_62
## DayF91:MoteGenG_62
## DayF100:MoteGenG_62
## DayF28:MoteGenG_31
## DayF62:MoteGenG_31
## DayF75:MoteGenG_31
## DayF91:MoteGenG_31
## DayF100:MoteGenG_31 0.826
## DayF28:MoteGenG_08 0.125 0.090
## DayF62:MoteGenG_08 0.207 0.156 0.643
## DayF75:MoteGenG_08 0.202 0.146 0.713 0.935
## DayF91:MoteGenG_08 0.238 0.197 0.537 0.886 0.863
## DayF100:MoteGenG_08 0.198 0.240 0.390 0.675 0.630
## DayF28:MoteGenG_07 0.212 0.152 0.281 0.181 0.200
## DayF62:MoteGenG_07 0.348 0.262 0.180 0.280 0.262
## DayF75:MoteGenG_07 0.340 0.246 0.200 0.263 0.281
## DayF91:MoteGenG_07 0.397 0.328 0.149 0.246 0.240
## DayF100:MoteGenG_07 0.328 0.397 0.107 0.186 0.173
## DayF28:MoteGenG_50 0.164 0.118 0.218 0.140 0.156
## DayF62:MoteGenG_50 0.271 0.204 0.140 0.218 0.204
## DayF75:MoteGenG_50 0.264 0.191 0.156 0.204 0.218
## DayF91:MoteGenG_50 0.311 0.257 0.117 0.193 0.188
## DayF100:MoteGenG_50 0.259 0.314 0.085 0.147 0.137
## DF91:MGG_08 DF100:MGG_08 DF28:MGG_07 DF62:MGG_07
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07
## MoteGenG_50
## DayF28:MoteGenG_62
## DayF62:MoteGenG_62
## DayF75:MoteGenG_62
## DayF91:MoteGenG_62
## DayF100:MoteGenG_62
## DayF28:MoteGenG_31
## DayF62:MoteGenG_31
## DayF75:MoteGenG_31
## DayF91:MoteGenG_31
## DayF100:MoteGenG_31
## DayF28:MoteGenG_08
## DayF62:MoteGenG_08
## DayF75:MoteGenG_08
## DayF91:MoteGenG_08
## DayF100:MoteGenG_08 0.840
## DayF28:MoteGenG_07 0.151 0.110
## DayF62:MoteGenG_07 0.248 0.189 0.641
## DayF75:MoteGenG_07 0.243 0.177 0.713 0.932
## DayF91:MoteGenG_07 0.283 0.236 0.532 0.873
## DayF100:MoteGenG_07 0.234 0.286 0.382 0.659
## DayF28:MoteGenG_50 0.117 0.085 0.368 0.236
## DayF62:MoteGenG_50 0.193 0.147 0.237 0.367
## DayF75:MoteGenG_50 0.188 0.138 0.262 0.343
## DayF91:MoteGenG_50 0.222 0.185 0.197 0.324
## DayF100:MoteGenG_50 0.185 0.226 0.143 0.247
## DF75:MGG_07 DF91:MGG_07 DF100:MGG_07 DF28:MGG_5 DF62:MGG_5
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07
## MoteGenG_50
## DayF28:MoteGenG_62
## DayF62:MoteGenG_62
## DayF75:MoteGenG_62
## DayF91:MoteGenG_62
## DayF100:MoteGenG_62
## DayF28:MoteGenG_31
## DayF62:MoteGenG_31
## DayF75:MoteGenG_31
## DayF91:MoteGenG_31
## DayF100:MoteGenG_31
## DayF28:MoteGenG_08
## DayF62:MoteGenG_08
## DayF75:MoteGenG_08
## DayF91:MoteGenG_08
## DayF100:MoteGenG_08
## DayF28:MoteGenG_07
## DayF62:MoteGenG_07
## DayF75:MoteGenG_07
## DayF91:MoteGenG_07 0.854
## DayF100:MoteGenG_07 0.617 0.825
## DayF28:MoteGenG_50 0.262 0.196 0.140
## DayF62:MoteGenG_50 0.344 0.323 0.243 0.643
## DayF75:MoteGenG_50 0.368 0.314 0.227 0.713 0.935
## DayF91:MoteGenG_50 0.317 0.371 0.306 0.537 0.885
## DayF100:MoteGenG_50 0.231 0.309 0.373 0.389 0.673
## DF75:MGG_5 DF91:MGG_5
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## MoteGenG_62
## MoteGenG_31
## MoteGenG_08
## MoteGenG_07
## MoteGenG_50
## DayF28:MoteGenG_62
## DayF62:MoteGenG_62
## DayF75:MoteGenG_62
## DayF91:MoteGenG_62
## DayF100:MoteGenG_62
## DayF28:MoteGenG_31
## DayF62:MoteGenG_31
## DayF75:MoteGenG_31
## DayF91:MoteGenG_31
## DayF100:MoteGenG_31
## DayF28:MoteGenG_08
## DayF62:MoteGenG_08
## DayF75:MoteGenG_08
## DayF91:MoteGenG_08
## DayF100:MoteGenG_08
## DayF28:MoteGenG_07
## DayF62:MoteGenG_07
## DayF75:MoteGenG_07
## DayF91:MoteGenG_07
## DayF100:MoteGenG_07
## DayF28:MoteGenG_50
## DayF62:MoteGenG_50
## DayF75:MoteGenG_50
## DayF91:MoteGenG_50 0.862
## DayF100:MoteGenG_50 0.628 0.838
##
## Standardized residuals:
## Min Q1 Med Q3 Max
## -3.23726470 -0.44297383 0.06763609 0.57977818 2.17326242
##
## Residual standard error: 0.5545399
## Degrees of freedom: 218 total; 182 residual
intervals(fit1)
## Approximate 95% confidence intervals
##
## Coefficients:
## lower est. upper
## (Intercept) 2.7977082 3.1437100 3.48971184
## DayF28 0.3235428 0.5924100 0.86127725
## DayF62 0.4661567 1.0314200 1.59668331
## DayF75 0.5541269 0.9914100 1.42869314
## DayF91 -0.6931773 -0.2597367 0.17370383
## DayF100 -1.8517535 -1.4058051 -0.95985672
## MoteGenG_62 -0.1226724 0.3800567 0.88278569
## MoteGenG_31 0.3003572 0.8996500 1.49894277
## MoteGenG_08 -0.5992380 0.2482900 1.09581797
## MoteGenG_07 0.0859832 0.5887122 1.09144125
## MoteGenG_50 0.3012548 0.9485650 1.59587518
## DayF28:MoteGenG_62 -0.8197271 -0.4235555 -0.02738387
## DayF62:MoteGenG_62 -1.5392841 -0.7179756 0.10333299
## DayF75:MoteGenG_62 -1.2888455 -0.6534878 -0.01813010
## DayF91:MoteGenG_62 -1.0916064 -0.4612887 0.16902895
## DayF100:MoteGenG_62 -1.2128775 -0.5638182 0.08524107
## DayF28:MoteGenG_31 -0.3086217 0.1570700 0.62276173
## DayF62:MoteGenG_31 -1.4137648 -0.4347000 0.54436477
## DayF75:MoteGenG_31 -1.6927866 -0.9353900 -0.17799338
## DayF91:MoteGenG_31 -1.3895560 -0.6388149 0.11192613
## DayF100:MoteGenG_31 -0.8195797 -0.0471744 0.72523086
## DayF28:MoteGenG_08 -2.6677976 -2.0092100 -1.35062244
## DayF62:MoteGenG_08 -3.7174267 -2.3328200 -0.94821333
## DayF75:MoteGenG_08 -3.3919806 -2.3208600 -1.24973943
## DayF91:MoteGenG_08 -2.8023796 -1.7505633 -0.69874697
## DayF100:MoteGenG_08 -1.0518356 0.0197551 1.09134579
## DayF28:MoteGenG_07 -1.4433873 -1.0527322 -0.66207717
## DayF62:MoteGenG_07 -2.9853904 -2.1614192 -1.33744799
## DayF75:MoteGenG_07 -2.8689232 -2.2335656 -1.59820788
## DayF91:MoteGenG_07 -2.1779049 -1.5475788 -0.91725265
## DayF100:MoteGenG_07 -1.7621427 -1.1130825 -0.46402229
## DayF28:MoteGenG_50 -1.2796896 -0.7766850 -0.27368044
## DayF62:MoteGenG_50 -3.2433558 -2.1858450 -1.12833418
## DayF75:MoteGenG_50 -3.1824169 -2.3643350 -1.54625315
## DayF91:MoteGenG_50 -2.9646349 -2.1602133 -1.35579166
## DayF100:MoteGenG_50 -1.9041441 -1.0834199 -0.26269565
## attr(,"label")
## [1] "Coefficients:"
##
## Correlation structure:
## lower est. upper
## cor(1,2) 0.47446657 0.71101930 0.8517974
## cor(1,3) -0.19952435 0.14041072 0.4501802
## cor(1,4) 0.03355041 0.35982766 0.6167933
## cor(1,5) -0.21795754 0.14046287 0.4654970
## cor(1,6) -0.45817775 -0.08845312 0.3073648
## cor(2,3) 0.17784943 0.50650363 0.7335039
## cor(2,4) 0.42759465 0.69423262 0.8497385
## cor(2,5) 0.05151143 0.41577108 0.6823934
## cor(2,6) -0.32051731 0.08933014 0.4710052
## cor(3,4) 0.80892189 0.89894652 0.9477813
## cor(3,5) 0.76342153 0.88087260 0.9419342
## cor(3,6) 0.22381035 0.54652927 0.7612470
## cor(4,5) 0.70728176 0.85227838 0.9284612
## cor(4,6) 0.11749926 0.46302287 0.7085471
## cor(5,6) 0.34868948 0.62827492 0.8051804
## attr(,"label")
## [1] "Correlation structure:"
##
## Variance function:
## lower est. upper
## 6 0.4769104 0.6822319 0.9759493
## 2 0.8147672 1.0417524 1.3319733
## 3 1.0286553 1.4399075 2.0155765
## 4 0.8835699 1.2123007 1.6633353
## 5 0.6285578 0.8848347 1.2456014
## attr(,"label")
## [1] "Variance function:"
##
## Residual standard error:
## lower est. upper
## 0.4355011 0.5545399 0.7061166
anova(fit1, type="marginal")
getVarCov(fit1)
## Marginal variance covariance matrix
## [,1] [,2] [,3] [,4] [,5] [,6]
## [1,] 0.307510 -0.018557 0.227780 0.062173 0.13414 0.03822
## [2,] -0.018557 0.143130 0.019524 0.165100 0.11776 0.11663
## [3,] 0.227780 0.019524 0.333730 0.233640 0.26962 0.11785
## [4,] 0.062173 0.165100 0.233640 0.637580 0.48255 0.34512
## [5,] 0.134140 0.117760 0.269620 0.482550 0.45195 0.28114
## [6,] 0.038220 0.116630 0.117850 0.345120 0.28114 0.24076
## Standard Deviations: 0.55454 0.37832 0.57769 0.79849 0.67227 0.49068
residuals(fit1, type="pearson")
## 2 13 14 17 18 21
## 0.580801781 0.707753866 0.957510453 -0.195697761 -0.133664356 0.342225633
## 23 24 26 32 34 37
## 0.484866399 -2.601656165 -0.142139850 1.295368101 -0.175580985 1.175433845
## 46 47 48 49 53 57
## 0.006023011 1.289789903 0.462978385 -1.377285857 -0.381505441 -0.556797899
## 60 68 69 70 71 74
## -0.693127126 1.471910844 -0.292254279 -2.241515781 0.786940629 -0.690842950
## 76 78 79 84 92 93
## 0.690842950 -1.206706015 0.828314266 0.367493826 0.593266568 1.236863146
## 95 96 99 101 105 110
## -0.041674186 -0.494058202 0.403983534 -1.085359177 0.357395365 0.296804597
## 111 112 117 119 120 121
## -0.498268900 -0.671126907 -0.857305265 -1.022757723 0.322989922 0.690849148
## 122 123 124 125 126 127
## -1.210162825 0.608194582 1.538676501 0.490492213 -0.179831252 0.415160120
## 128 129 130 131 132 133
## -1.477843584 0.714109584 0.748550166 0.562100715 -1.196987308 0.236172719
## 134 135 136 137 138 139
## 1.518668561 0.406943036 -1.227465087 -0.052613250 -0.408392188 -0.147078251
## 140 141 142 143 144 145
## 1.112685801 -0.106535170 -0.811420475 -1.308531670 0.708007084 1.308531670
## 146 147 148 149 150 151
## -0.663399521 -0.557853972 -0.781189447 0.284134421 -1.985974288 -2.851547589
## 152 153 154 155 156 157
## -0.825420654 -0.366492033 2.082210031 -0.587162750 -1.678918490 0.185046280
## 158 159 160 161 162 163
## -0.571583550 0.707605255 0.919482379 0.625556824 0.209903759 0.701860285
## 164 165 166 167 168 169
## -0.134363972 0.742954754 0.307256451 -1.481789675 1.167712996 -0.800980644
## 170 171 172 173 174 175
## 0.894072997 -0.363514674 -0.663050766 -0.701966171 0.892826661 1.002054166
## 176 177 178 179 180 181
## -0.173136846 0.439160347 -0.368188435 0.203914422 0.164583572 0.363514674
## 182 183 184 185 186 187
## -0.455778161 0.576707376 -1.029475583 0.066817459 0.864091692 0.320723804
## 188 189 190 191 192 193
## 0.822408675 -0.095180107 0.988732070 0.110045737 -2.446542044 2.173262422
## 194 195 196 197 198 199
## -0.080681446 -0.384289684 0.045298217 0.282130096 0.072912972 -0.193779185
## 200 201 202 203 204 205
## 0.095180107 0.405238051 0.317914083 0.088653869 0.430840271 0.124172469
## 206 207 208 209 210 211
## -0.057796868 -0.326757205 -3.237264702 -0.340297712 -0.681318018 0.036289897
## 212 213 214 215 216 217
## 1.264981199 0.158637687 0.053572601 0.471753802 -0.024208309 0.460091849
## 218 219 220 221 222 223
## 0.033549596 -1.074633508 1.587615325 0.462611502 0.746875799 -1.602382157
## 224 225 226 227 228 229
## 0.363775866 -0.025084968 -0.068894256 0.028609573 0.362850704 0.955539910
## 230 231 232 233 234 235
## -0.578815794 0.561947550 0.306887669 -0.616221447 0.295045520 -0.349661542
## 236 237 238 239 240 241
## -3.191413586 -0.418268323 0.623163111 -0.104703435 0.356583373 0.646690395
## 242 243 244 245 246 247
## 0.450831339 1.289083569 1.280112294 1.185107356 -2.816163747 -0.784031221
## 248 249 250 251 252 253
## 0.175941437 -0.124979706 1.070718647 0.020497743 0.640591647 1.212936818
## 254 255 256 257 258 259
## -0.646392895 -0.531433977 -0.853943696 -0.640591647 -0.295343020 -0.157327861
## 260 261 262 263 264 265
## -0.253453382 0.116041486 0.842123034 0.075088973 -0.202101595 0.068454726
## 266 267 268 269 270 271
## 0.312749650 -0.076982073 -1.122820297 0.135883910 -0.168692248 -0.443483335
## 272 273 274 275 276 277
## -0.195186299 -0.441445331 0.426554216 0.051615973 -0.059322880 -0.584516485
## 278 279 280 281 282 283
## -2.986371063 -1.523628682 1.971619448 0.097471061 0.294885478 1.004651974
## 284 285 286 287 288 289
## 0.130381300 -0.116519348 1.637859786 0.602420266 -0.061765205 0.820041819
## 290 291 292 293 294 295
## -0.135540946 0.702415996 -1.086307029 -1.970491496 -0.426554216 0.396989473
## 296 297
## 0.586520556 -0.048384641
## attr(,"std")
## 1 1 1 1 1 1 1 1
## 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399
## 1 1 1 1 1 1 1 1
## 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399
## 1 1 1 1 1 1 1 1
## 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399
## 1 1 1 1 1 1 1 1
## 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399
## 1 1 1 1 1 1 1 6
## 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.5545399 0.3783248
## 6 6 6 6 6 6 6 6
## 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248
## 6 6 6 6 6 6 6 6
## 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248
## 6 6 6 6 6 6 6 6
## 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248
## 6 6 6 6 6 6 6 2
## 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.3783248 0.5776933
## 2 2 2 2 2 2 2 2
## 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933
## 2 2 2 2 2 2 2 2
## 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933
## 2 2 2 2 2 2 2 2
## 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933
## 2 2 2 2 2 2 2 2
## 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933
## 2 2 2 2 2 3 3 3
## 0.5776933 0.5776933 0.5776933 0.5776933 0.5776933 0.7984862 0.7984862 0.7984862
## 3 3 3 3 3 3 3 3
## 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862
## 3 3 3 3 3 3 3 3
## 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862
## 3 3 3 3 3 3 3 3
## 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862
## 3 3 3 3 3 3 3 3
## 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862 0.7984862
## 3 3 3 4 4 4 4 4
## 0.7984862 0.7984862 0.7984862 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691
## 4 4 4 4 4 4 4 4
## 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691
## 4 4 4 4 4 4 4 4
## 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691
## 4 4 4 4 4 4 4 4
## 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691
## 4 4 4 4 4 4 4 4
## 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691 0.6722691
## 4 4 5 5 5 5 5 5
## 0.6722691 0.6722691 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762
## 5 5 5 5 5 5 5 5
## 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762
## 5 5 5 5 5 5 5 5
## 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762
## 5 5 5 5 5 5 5 5
## 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762 0.4906762
## 5 5
## 0.4906762 0.4906762
## attr(,"label")
## [1] "Standardized residuals"
par(mfrow=c(1,2))
plot(fitted(fit1), residuals(fit1, type="pearson"))
abline(h=0)
qqnorm(residuals(fit1, type="pearson"))
abline(0,1)
Predictions
clda_Gls_1 <- Gls(dAW.gd ~ DayF * MoteGen,
correlation=corSymm (form = ~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"),
data=A_data)
data1<-expand.grid(DayF=unique(BW.Tall$DayF),
MoteGen=unique(BW.Tall$MoteGen))
predictions_1 <- cbind(data1,
predict (clda_Gls_1, data1, conf.int=0.95))
predictions_1$Days<-as.numeric(as.character(predictions_1$DayF))
Model prediction Ambient (heat) and genotype (tanks?)
pd <- position_dodge(2)
limits <- aes(ymax = upper , ymin=lower, shape=MoteGen)
pCI1 <- ggplot(predictions_1, aes(y=linear.predictors, x=Days,
fill=MoteGen)) +
geom_errorbar(limits, width= 2 , position=pd) +
geom_line(aes(group=MoteGen, y=linear.predictors), position=pd, size=0.1) +
geom_point(aes(fill=MoteGen), shape=21, position=pd, size=4, alpha=0.8) +
ggthe_bw+
geom_hline(yintercept = 0, linetype=3)+
scale_x_continuous(name="Days in the experiment",
breaks = seq(0, 115, by=15)) +
scale_y_continuous(name="Estimated growth (mg / g d) ",
breaks = seq(-1, 4, by=1)) +
theme(text=element_text(size=14),
legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = -16, y = -1.2, label = "Baseline", size=3)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = 45, y = -1.2, label = "Nutrients", size=3)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = -1,
colour = "gray90")+
annotate("segment", x = 91, xend = 110, y = -1, yend = -1,
colour = "gray90")+
annotate("text", x = 99, y = -1.2, label = "Heat", size=3)
pCI1
# Calculate relative changes (1 - Ambient)
D75<-subset(predictions_1, DayF=="75" )
D75 <- subset(D75, select = c(MoteGen, linear.predictors))
colnames(D75)<-c("MoteGen", "Day75")
H_effects<-merge(predictions_1, D75, by=c("MoteGen"), all.x = T)
summary(H_effects)
## MoteGen DayF linear.predictors lower upper
## G_48:6 -28:6 Min. :1.214 Min. :0.7017 Min. :1.483
## G_62:6 28 :6 1st Qu.:2.048 1st Qu.:1.4843 1st Qu.:2.891
## G_31:6 62 :6 Median :3.041 Median :2.5983 Median :3.536
## G_08:6 75 :6 Mean :2.985 Mean :2.4832 Mean :3.487
## G_07:6 91 :6 3rd Qu.:3.843 3rd Qu.:3.3721 3rd Qu.:4.315
## G_50:6 100:6 Max. :4.793 Max. :4.2865 Max. :5.340
## Days Day75
## Min. :-28.00 Min. :2.063
## 1st Qu.: 28.00 1st Qu.:2.490
## Median : 68.50 Median :3.291
## Mean : 54.67 Mean :3.228
## 3rd Qu.: 91.00 3rd Qu.:4.099
## Max. :100.00 Max. :4.135
H_effects$effects<-(H_effects$linear.predictors-H_effects$Day75)
H_effects$effects_l<-H_effects$lower-H_effects$Day75
H_effects$effects_u<-H_effects$upper-H_effects$Day75
Difference Ambient (heat)
pd <- position_dodge(3)
limits <- aes(ymax = effects_u , ymin=effects_l, shape=MoteGen)
Gen_heat <- ggplot(H_effects, aes(y=effects, x=Days,
fill=MoteGen)) +
geom_errorbar(limits, width= 10 , position=pd) +
geom_line(aes(group=MoteGen, y=effects), position=pd, size=0.1) +
geom_point(aes(fill=MoteGen), shape=21, position=pd, size=4, alpha=0.8) +
ggthe_bw+
geom_hline(yintercept = 0, linetype=3)+
scale_x_continuous(name="Days in the experiment",
breaks = seq(0, 115, by=15)) +
#scale_y_continuous(name="Estimated growth (mg / g d) ",
# breaks = seq(-1, 4, by=1)) +
theme(text=element_text(size=14),
legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = -16, y = -1.2, label = "Baseline", size=3)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = 45, y = -1.2, label = "Nutrients", size=3)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = -1,
colour = "gray90")+
annotate("segment", x = 91, xend = 110, y = -1, yend = -1,
colour = "gray90")+
annotate("text", x = 99, y = -1.2, label = "Heat", size=3)
Gen_heat
fit2 <- gls(dAW.gd~Treatment * DayF, data=subset(BW.Tall),
correlation=corSymm(form=~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"))
Only treatment summary model
summary(fit2)
## Generalized least squares fit by REML
## Model: dAW.gd ~ Treatment * DayF
## Data: subset(BW.Tall)
## AIC BIC logLik
## 1197.705 1368.99 -559.8526
##
## Correlation Structure: General
## Formula: ~TimePoint | Fra
## Parameter estimate(s):
## Correlation:
## 1 2 3 4 5
## 2 0.368
## 3 -0.239 0.565
## 4 -0.119 0.541 0.879
## 5 -0.237 0.463 0.880 0.880
## 6 -0.084 0.221 0.449 0.329 0.474
## Variance function:
## Structure: Different standard deviations per stratum
## Formula: ~1 | TimePoint
## Parameter estimates:
## 1 2 3 4 5 6
## 1.0000000 0.8724427 1.0009090 0.9254233 0.7139897 0.5383970
##
## Coefficients:
## Value Std.Error t-value p-value
## (Intercept) 3.592633 0.1570892 22.870020 0.0000
## TreatmentNH4 0.151325 0.2201732 0.687298 0.4922
## TreatmentNH4+PO4 0.005666 0.2215324 0.025577 0.9796
## DayF28 0.075303 0.1667363 0.451627 0.6517
## DayF62 -0.030234 0.2475594 -0.122128 0.9028
## DayF75 -0.156269 0.2264249 -0.690159 0.4904
## DayF91 -1.119866 0.2146910 -5.216175 0.0000
## DayF100 -1.899000 0.1878239 -10.110533 0.0000
## TreatmentNH4:DayF28 -1.159351 0.2331951 -4.971592 0.0000
## TreatmentNH4+PO4:DayF28 -0.595302 0.2346269 -2.537228 0.0114
## TreatmentNH4:DayF62 -2.007043 0.3461592 -5.798036 0.0000
## TreatmentNH4+PO4:DayF62 -1.839863 0.3486597 -5.276958 0.0000
## TreatmentNH4:DayF75 -2.644097 0.3175573 -8.326363 0.0000
## TreatmentNH4+PO4:DayF75 -2.140576 0.3192174 -6.705701 0.0000
## TreatmentNH4:DayF91 -2.227811 0.3027410 -7.358802 0.0000
## TreatmentNH4+PO4:DayF91 -1.436561 0.3031894 -4.738163 0.0000
## TreatmentNH4:DayF100 -2.389073 0.2767967 -8.631147 0.0000
## TreatmentNH4+PO4:DayF100 -2.364241 0.2762547 -8.558194 0.0000
##
## Correlation:
## (Intr) TrtNH4 TrNH4+PO4 DayF28 DayF62 DayF75 DayF91
## TreatmentNH4 -0.713
## TreatmentNH4+PO4 -0.709 0.506
## DayF28 -0.639 0.456 0.453
## DayF62 -0.786 0.561 0.558 0.844
## DayF75 -0.770 0.550 0.546 0.801 0.953
## DayF91 -0.856 0.611 0.607 0.784 0.946 0.945
## DayF100 -0.874 0.624 0.620 0.652 0.810 0.766 0.861
## TreatmentNH4:DayF28 0.457 -0.643 -0.324 -0.715 -0.603 -0.573 -0.560
## TreatmentNH4+PO4:DayF28 0.454 -0.324 -0.643 -0.711 -0.600 -0.570 -0.557
## TreatmentNH4:DayF62 0.562 -0.787 -0.399 -0.603 -0.715 -0.681 -0.676
## TreatmentNH4+PO4:DayF62 0.558 -0.398 -0.786 -0.599 -0.710 -0.676 -0.672
## TreatmentNH4:DayF75 0.549 -0.770 -0.390 -0.571 -0.679 -0.713 -0.674
## TreatmentNH4+PO4:DayF75 0.547 -0.390 -0.770 -0.568 -0.676 -0.709 -0.670
## TreatmentNH4:DayF91 0.607 -0.850 -0.430 -0.556 -0.671 -0.670 -0.709
## TreatmentNH4+PO4:DayF91 0.606 -0.432 -0.854 -0.555 -0.670 -0.669 -0.708
## TreatmentNH4:DayF100 0.593 -0.831 -0.421 -0.443 -0.550 -0.520 -0.584
## TreatmentNH4+PO4:DayF100 0.594 -0.424 -0.838 -0.444 -0.551 -0.521 -0.585
## DyF100 TNH4:DF2 TNH4+PO4:DF2 TNH4:DF6 TNH4+PO4:DF6
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## TreatmentNH4:DayF28 -0.467
## TreatmentNH4+PO4:DayF28 -0.464 0.508
## TreatmentNH4:DayF62 -0.579 0.846 0.429
## TreatmentNH4+PO4:DayF62 -0.575 0.428 0.845 0.508
## TreatmentNH4:DayF75 -0.546 0.802 0.406 0.951 0.482
## TreatmentNH4+PO4:DayF75 -0.543 0.406 0.802 0.483 0.953
## TreatmentNH4:DayF91 -0.610 0.780 0.395 0.939 0.476
## TreatmentNH4+PO4:DayF91 -0.610 0.397 0.784 0.479 0.944
## TreatmentNH4:DayF100 -0.679 0.622 0.315 0.770 0.390
## TreatmentNH4+PO4:DayF100 -0.680 0.317 0.627 0.394 0.776
## TNH4:DF7 TNH4+PO4:DF7 TNH4:DF9 TNH4+PO4:DF9 TNH4:DF1
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## DayF91
## DayF100
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75 0.506
## TreatmentNH4:DayF91 0.938 0.475
## TreatmentNH4+PO4:DayF91 0.477 0.943 0.502
## TreatmentNH4:DayF100 0.725 0.369 0.818 0.414
## TreatmentNH4+PO4:DayF100 0.371 0.733 0.415 0.825 0.461
##
## Standardized residuals:
## Min Q1 Med Q3 Max
## -2.35265042 -0.73045334 0.08440353 0.72631830 4.60762700
##
## Residual standard error: 0.9810218
## Degrees of freedom: 615 total; 597 residual
intervals(fit2)
## Approximate 95% confidence intervals
##
## Coefficients:
## lower est. upper
## (Intercept) 3.2841187 3.592633333 3.9011480
## TreatmentNH4 -0.2810837 0.151324574 0.5837328
## TreatmentNH4+PO4 -0.4294115 0.005666104 0.4407437
## DayF28 -0.2521584 0.075302587 0.4027635
## DayF62 -0.5164271 -0.030233951 0.4559592
## DayF75 -0.6009553 -0.156269231 0.2884169
## DayF91 -1.5415076 -1.119866128 -0.6982246
## DayF100 -2.2678759 -1.898999941 -1.5301240
## TreatmentNH4:DayF28 -1.6173332 -1.159350739 -0.7013683
## TreatmentNH4+PO4:DayF28 -1.0560965 -0.595302025 -0.1345076
## TreatmentNH4:DayF62 -2.6868812 -2.007043469 -1.3272057
## TreatmentNH4+PO4:DayF62 -2.5246112 -1.839862547 -1.1551139
## TreatmentNH4:DayF75 -3.2677621 -2.644096913 -2.0204317
## TreatmentNH4+PO4:DayF75 -2.7675020 -2.140576474 -1.5136509
## TreatmentNH4:DayF91 -2.8223782 -2.227811339 -1.6332445
## TreatmentNH4+PO4:DayF91 -2.0320085 -1.436560975 -0.8411135
## TreatmentNH4:DayF100 -2.9326863 -2.389072724 -1.8454591
## TreatmentNH4+PO4:DayF100 -2.9067902 -2.364241084 -1.8216919
## attr(,"label")
## [1] "Coefficients:"
##
## Correlation structure:
## lower est. upper
## cor(1,2) 0.20234236 0.36835401 0.51378670
## cor(1,3) -0.43534251 -0.23889155 -0.02072380
## cor(1,4) -0.31662009 -0.11949185 0.08753058
## cor(1,5) -0.43989483 -0.23749502 -0.01213444
## cor(1,6) -0.41520904 -0.08427761 0.26635192
## cor(2,3) 0.38498636 0.56541173 0.70421046
## cor(2,4) 0.36509229 0.54121657 0.67993882
## cor(2,5) 0.25667952 0.46340662 0.62958675
## cor(2,6) -0.04227154 0.22112987 0.45578990
## cor(3,4) 0.82548601 0.87918045 0.91710440
## cor(3,5) 0.81987949 0.87991381 0.92080933
## cor(3,6) 0.20018645 0.44873031 0.64301186
## cor(4,5) 0.82141684 0.88045661 0.92082622
## cor(4,6) 0.07180291 0.32851209 0.54440310
## cor(5,6) 0.21815173 0.47424256 0.66922878
## attr(,"label")
## [1] "Correlation structure:"
##
## Variance function:
## lower est. upper
## 2 0.6940697 0.8724427 1.0966567
## 3 0.7929781 1.0009090 1.2633627
## 4 0.7248079 0.9254233 1.1815659
## 5 0.5644424 0.7139897 0.9031590
## 6 0.4145889 0.5383970 0.6991778
## attr(,"label")
## [1] "Variance function:"
##
## Residual standard error:
## lower est. upper
## 0.8341670 0.9810218 1.1537303
anova(fit2, type="marginal")
getVarCov(fit2)
## Marginal variance covariance matrix
## [,1] [,2] [,3] [,4] [,5]
## [1,] 0.96240 0.30929 -0.23012 -0.10642 -0.16319
## [2,] 0.30929 0.73254 0.47518 0.42054 0.27781
## [3,] -0.23012 0.47518 0.96415 0.78374 0.60518
## [4,] -0.10642 0.42054 0.78374 0.82421 0.55988
## [5,] -0.16319 0.27781 0.60518 0.55988 0.49062
## Standard Deviations: 0.98102 0.85589 0.98191 0.90786 0.70044
#residuals(fit2, type="pearson")
par(mfrow=c(1,2))
plot(fitted(fit2), residuals(fit2, type="pearson"))
abline(h=0)
qqnorm(residuals(fit2, type="pearson"))
abline(0,1)
Predictions
clda_Gls_2 <- Gls(dAW.gd~Treatment * DayF, data=BW.Tall,
correlation=corSymm(form=~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"))
data2<-expand.grid(DayF=unique(BW.Tall$DayF),
Treatment=unique(BW.Tall$Treatment))
predictions_2 <- cbind(data2,
predict (clda_Gls_2, data2, conf.int=0.95))
predictions_2$Days<-as.numeric(as.character(predictions_2$DayF))
Model prediction Ambient (heat)
pd <- position_dodge(2)
limits <- aes(ymax = upper , ymin=lower, shape=Treatment)
Model_Tratement <- ggplot(predictions_2, aes(y=linear.predictors, x=Days,
fill=Treatment)) +
geom_errorbar(limits, width= 2 , position=pd) +
geom_line(aes(group=Treatment, y=linear.predictors), position=pd, size=0.1) +
geom_point(aes(fill=Treatment), shape=21, position=pd, size=4, alpha=0.8) +
ggthe_bw+
geom_hline(yintercept = 0, linetype=3)+
scale_x_continuous(name="Days in the experiment",
breaks = seq(0, 115, by=15)) +
scale_y_continuous(name="Estimated growth (mg / g d) ",
breaks = seq(-1, 4, by=1)) +
theme(text=element_text(size=14),
legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = -16, y = -1.2, label = "Baseline", size=3)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = 45, y = -1.2, label = "Nutrients", size=3)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = -1,
colour = "gray90")+
annotate("segment", x = 91, xend = 110, y = -1, yend = -1,
colour = "gray90")+
annotate("text", x = 99, y = -1.2, label = "Heat", size=3)
Model_Tratement
BW.nutrients<-subset(BW.Tall, Days<91)
fit3 <- gls(dAW.gd ~ Treatment * DayF * Genotype, data=BW.nutrients,
correlation=corSymm(form=~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"))
Summary model
summary(fit3)
## Generalized least squares fit by REML
## Model: dAW.gd ~ Treatment * DayF * Genotype
## Data: BW.nutrients
## AIC BIC logLik
## 934.9465 1261.836 -385.4733
##
## Correlation Structure: General
## Formula: ~TimePoint | Fra
## Parameter estimate(s):
## Correlation:
## 1 2 3
## 2 0.542
## 3 0.194 0.606
## 4 0.347 0.631 0.798
## Variance function:
## Structure: Different standard deviations per stratum
## Formula: ~1 | TimePoint
## Parameter estimates:
## 1 2 3 4
## 1.0000000 0.7982069 0.7564044 0.7762808
##
## Coefficients:
## Value Std.Error t-value
## (Intercept) 3.1437100 0.2654873 11.841284
## TreatmentNH4 0.1582789 0.3857441 0.410321
## TreatmentNH4+PO4 -0.2115656 0.3857441 -0.548461
## DayF28 0.5924100 0.2331779 2.540592
## DayF62 1.0314200 0.3002249 3.435491
## DayF75 0.9914100 0.2737660 3.621378
## GenotypeGreen and Orange 0.3800567 0.3857441 0.985256
## GenotypeOrange 0.8996500 0.4598374 1.956452
## GenotypeRed and Orange 0.5887122 0.3857441 1.526173
## GenotypeRed and Yellow 0.9485650 0.4966812 1.909807
## GenotypeYellow 0.2482900 0.6503083 0.381804
## TreatmentNH4:DayF28 -0.7899878 0.3387996 -2.331726
## TreatmentNH4+PO4:DayF28 -0.0389767 0.3387996 -0.115043
## TreatmentNH4:DayF62 -1.6674200 0.4362167 -3.822458
## TreatmentNH4+PO4:DayF62 -1.3762867 0.4362167 -3.155052
## TreatmentNH4:DayF75 -2.6294211 0.3977727 -6.610360
## TreatmentNH4+PO4:DayF75 -1.9964656 0.3977727 -5.019111
## TreatmentNH4:GenotypeGreen and Orange -0.7456956 0.5455245 -1.366933
## TreatmentNH4+PO4:GenotypeGreen and Orange -0.2370611 0.5455245 -0.434556
## TreatmentNH4:GenotypeOrange -0.1267222 0.6381520 -0.198577
## TreatmentNH4+PO4:GenotypeOrange 0.9772456 0.6563021 1.489018
## TreatmentNH4:GenotypeRed and Orange 0.0605211 0.5526558 0.109510
## TreatmentNH4+PO4:GenotypeRed and Orange 0.5891933 0.5614426 1.049428
## TreatmentNH4:GenotypeRed and Yellow 0.8689961 0.7079660 1.227455
## TreatmentNH4+PO4:GenotypeRed and Yellow -0.2408894 0.6826230 -0.352888
## TreatmentNH4:GenotypeYellow 1.1841156 0.9014242 1.313605
## TreatmentNH4+PO4:GenotypeYellow 0.9303904 0.9014242 1.032134
## DayF28:GenotypeGreen and Orange -0.4987391 0.3427622 -1.455059
## DayF62:GenotypeGreen and Orange -0.7179756 0.4362167 -1.645915
## DayF75:GenotypeGreen and Orange -0.6534878 0.3977727 -1.642867
## DayF28:GenotypeOrange 0.1570700 0.4038760 0.388907
## DayF62:GenotypeOrange -0.4347000 0.5200049 -0.835954
## DayF75:GenotypeOrange -0.9353900 0.4741766 -1.972662
## DayF28:GenotypeRed and Orange -1.0527322 0.3387996 -3.107241
## DayF62:GenotypeRed and Orange -2.1643384 0.4382579 -4.938504
## DayF75:GenotypeRed and Orange -2.2335656 0.3977727 -5.615180
## DayF28:GenotypeRed and Yellow -0.7766850 0.4362359 -1.780424
## DayF62:GenotypeRed and Yellow -2.1858450 0.5616694 -3.891693
## DayF75:GenotypeRed and Yellow -2.3643350 0.5121692 -4.616316
## DayF28:GenotypeYellow -2.0092100 0.5711669 -3.517729
## DayF62:GenotypeYellow -2.3328200 0.7353979 -3.172187
## DayF75:GenotypeYellow -2.3208600 0.6705869 -3.460938
## TreatmentNH4:DayF28:GenotypeGreen and Orange 0.3435869 0.4819451 0.712917
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.0426142 0.4819451 -0.088421
## TreatmentNH4:DayF62:GenotypeGreen and Orange 0.6953556 0.6169036 1.127170
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.3883422 0.6169036 0.629502
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.8369689 0.5625356 1.487851
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.3672533 0.5625356 0.652854
## TreatmentNH4:DayF28:GenotypeOrange -0.9476256 0.5604899 -1.690709
## TreatmentNH4+PO4:DayF28:GenotypeOrange -1.0182833 0.5764312 -1.766531
## TreatmentNH4:DayF62:GenotypeOrange -1.3375667 0.7216510 -1.853481
## TreatmentNH4+PO4:DayF62:GenotypeOrange -2.6462133 0.7421759 -3.565480
## TreatmentNH4:DayF75:GenotypeOrange -0.7294822 0.6580515 -1.108549
## TreatmentNH4+PO4:DayF75:GenotypeOrange -1.8174544 0.6767676 -2.685493
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.7342900 0.4853985 -1.512757
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -1.2269761 0.4931160 -2.488210
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.1081394 0.6263945 -0.172638
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.7452199 0.6363087 -1.171161
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.3198641 0.5715238 0.559669
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.2810461 0.5789501 0.485441
## TreatmentNH4:DayF28:GenotypeRed and Yellow -1.3267372 0.6218077 -2.133678
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -1.0124683 0.5995489 -1.688717
## TreatmentNH4:DayF62:GenotypeRed and Yellow -1.9182550 0.8005999 -2.396022
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.4040147 0.7798220 -0.518086
## TreatmentNH4:DayF75:GenotypeRed and Yellow -1.5651456 0.7960577 -1.966121
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.3874455 0.7129311 -0.543454
## TreatmentNH4:DayF28:GenotypeYellow 0.0676933 0.8026764 0.084334
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.2241815 0.8026764 -0.279293
## TreatmentNH4:DayF62:GenotypeYellow -0.9988078 1.0088681 -0.990028
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.1565715 1.0088681 -0.155195
## TreatmentNH4:DayF75:GenotypeYellow -0.3418234 0.9269266 -0.368771
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.2149427 0.9269266 -0.231887
## p-value
## (Intercept) 0.0000
## TreatmentNH4 0.6818
## TreatmentNH4+PO4 0.5837
## DayF28 0.0114
## DayF62 0.0007
## DayF75 0.0003
## GenotypeGreen and Orange 0.3251
## GenotypeOrange 0.0511
## GenotypeRed and Orange 0.1278
## GenotypeRed and Yellow 0.0569
## GenotypeYellow 0.7028
## TreatmentNH4:DayF28 0.0202
## TreatmentNH4+PO4:DayF28 0.9085
## TreatmentNH4:DayF62 0.0002
## TreatmentNH4+PO4:DayF62 0.0017
## TreatmentNH4:DayF75 0.0000
## TreatmentNH4+PO4:DayF75 0.0000
## TreatmentNH4:GenotypeGreen and Orange 0.1724
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.6641
## TreatmentNH4:GenotypeOrange 0.8427
## TreatmentNH4+PO4:GenotypeOrange 0.1373
## TreatmentNH4:GenotypeRed and Orange 0.9129
## TreatmentNH4+PO4:GenotypeRed and Orange 0.2946
## TreatmentNH4:GenotypeRed and Yellow 0.2204
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.7244
## TreatmentNH4:GenotypeYellow 0.1897
## TreatmentNH4+PO4:GenotypeYellow 0.3026
## DayF28:GenotypeGreen and Orange 0.1464
## DayF62:GenotypeGreen and Orange 0.1006
## DayF75:GenotypeGreen and Orange 0.1012
## DayF28:GenotypeOrange 0.6976
## DayF62:GenotypeOrange 0.4037
## DayF75:GenotypeOrange 0.0492
## DayF28:GenotypeRed and Orange 0.0020
## DayF62:GenotypeRed and Orange 0.0000
## DayF75:GenotypeRed and Orange 0.0000
## DayF28:GenotypeRed and Yellow 0.0758
## DayF62:GenotypeRed and Yellow 0.0001
## DayF75:GenotypeRed and Yellow 0.0000
## DayF28:GenotypeYellow 0.0005
## DayF62:GenotypeYellow 0.0016
## DayF75:GenotypeYellow 0.0006
## TreatmentNH4:DayF28:GenotypeGreen and Orange 0.4763
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange 0.9296
## TreatmentNH4:DayF62:GenotypeGreen and Orange 0.2603
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.5294
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.1376
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.5142
## TreatmentNH4:DayF28:GenotypeOrange 0.0917
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.0781
## TreatmentNH4:DayF62:GenotypeOrange 0.0646
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.0004
## TreatmentNH4:DayF75:GenotypeOrange 0.2683
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.0075
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.1311
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.0132
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.8630
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.2422
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.5760
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.6276
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.0335
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.0921
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.0170
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.6047
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.0500
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.5871
## TreatmentNH4:DayF28:GenotypeYellow 0.9328
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.7802
## TreatmentNH4:DayF62:GenotypeYellow 0.3228
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.8767
## TreatmentNH4:DayF75:GenotypeYellow 0.7125
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.8167
##
## Correlation:
## (Intr) TrtNH4 TrNH4+PO4 DayF28
## TreatmentNH4 -0.688
## TreatmentNH4+PO4 -0.688 0.474
## DayF28 -0.646 0.444 0.444
## DayF62 -0.755 0.519 0.519 0.792
## DayF75 -0.708 0.487 0.487 0.760
## GenotypeGreen and Orange -0.688 0.474 0.474 0.444
## GenotypeOrange -0.577 0.397 0.397 0.373
## GenotypeRed and Orange -0.688 0.474 0.474 0.444
## GenotypeRed and Yellow -0.535 0.368 0.368 0.345
## GenotypeYellow -0.408 0.281 0.281 0.264
## TreatmentNH4:DayF28 0.444 -0.646 -0.306 -0.688
## TreatmentNH4+PO4:DayF28 0.444 -0.306 -0.646 -0.688
## TreatmentNH4:DayF62 0.519 -0.755 -0.357 -0.545
## TreatmentNH4+PO4:DayF62 0.519 -0.357 -0.755 -0.545
## TreatmentNH4:DayF75 0.487 -0.708 -0.335 -0.523
## TreatmentNH4+PO4:DayF75 0.487 -0.335 -0.708 -0.523
## TreatmentNH4:GenotypeGreen and Orange 0.487 -0.707 -0.335 -0.314
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.487 -0.335 -0.707 -0.314
## TreatmentNH4:GenotypeOrange 0.416 -0.604 -0.286 -0.269
## TreatmentNH4+PO4:GenotypeOrange 0.405 -0.278 -0.588 -0.261
## TreatmentNH4:GenotypeRed and Orange 0.480 -0.698 -0.331 -0.310
## TreatmentNH4+PO4:GenotypeRed and Orange 0.473 -0.325 -0.687 -0.305
## TreatmentNH4:GenotypeRed and Yellow 0.375 -0.545 -0.258 -0.242
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.389 -0.268 -0.565 -0.251
## TreatmentNH4:GenotypeYellow 0.295 -0.428 -0.203 -0.190
## TreatmentNH4+PO4:GenotypeYellow 0.295 -0.203 -0.428 -0.190
## DayF28:GenotypeGreen and Orange 0.439 -0.302 -0.302 -0.680
## DayF62:GenotypeGreen and Orange 0.519 -0.357 -0.357 -0.545
## DayF75:GenotypeGreen and Orange 0.487 -0.335 -0.335 -0.523
## DayF28:GenotypeOrange 0.373 -0.257 -0.257 -0.577
## DayF62:GenotypeOrange 0.436 -0.300 -0.300 -0.457
## DayF75:GenotypeOrange 0.409 -0.281 -0.281 -0.439
## DayF28:GenotypeRed and Orange 0.444 -0.306 -0.306 -0.688
## DayF62:GenotypeRed and Orange 0.517 -0.356 -0.356 -0.543
## DayF75:GenotypeRed and Orange 0.487 -0.335 -0.335 -0.523
## DayF28:GenotypeRed and Yellow 0.345 -0.238 -0.238 -0.535
## DayF62:GenotypeRed and Yellow 0.403 -0.278 -0.278 -0.423
## DayF75:GenotypeRed and Yellow 0.379 -0.261 -0.261 -0.406
## DayF28:GenotypeYellow 0.264 -0.181 -0.181 -0.408
## DayF62:GenotypeYellow 0.308 -0.212 -0.212 -0.323
## DayF75:GenotypeYellow 0.289 -0.199 -0.199 -0.310
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.312 0.454 0.215 0.484
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.312 0.215 0.454 0.484
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.367 0.534 0.253 0.385
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.367 0.253 0.534 0.385
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.345 0.501 0.237 0.370
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.345 0.237 0.501 0.370
## TreatmentNH4:DayF28:GenotypeOrange -0.269 0.390 0.185 0.416
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.261 0.180 0.380 0.405
## TreatmentNH4:DayF62:GenotypeOrange -0.314 0.456 0.216 0.329
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.305 0.210 0.444 0.320
## TreatmentNH4:DayF75:GenotypeOrange -0.295 0.428 0.203 0.316
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.287 0.197 0.416 0.307
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.310 0.451 0.213 0.480
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.305 0.210 0.444 0.473
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.362 0.525 0.249 0.380
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.356 0.245 0.517 0.374
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.339 0.493 0.234 0.364
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.335 0.231 0.487 0.359
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.242 0.352 0.167 0.375
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.251 0.173 0.365 0.389
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.283 0.411 0.195 0.297
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.291 0.200 0.422 0.305
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.244 0.354 0.168 0.261
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.272 0.187 0.395 0.292
## TreatmentNH4:DayF28:GenotypeYellow -0.188 0.273 0.129 0.291
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.188 0.129 0.273 0.291
## TreatmentNH4:DayF62:GenotypeYellow -0.225 0.326 0.155 0.236
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.225 0.155 0.326 0.236
## TreatmentNH4:DayF75:GenotypeYellow -0.209 0.304 0.144 0.225
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.209 0.144 0.304 0.225
## DayF62 DayF75 GntGaO GntypO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75 0.902
## GenotypeGreen and Orange 0.519 0.487
## GenotypeOrange 0.436 0.409 0.397
## GenotypeRed and Orange 0.519 0.487 0.474 0.397
## GenotypeRed and Yellow 0.403 0.379 0.368 0.309
## GenotypeYellow 0.308 0.289 0.281 0.236
## TreatmentNH4:DayF28 -0.545 -0.523 -0.306 -0.257
## TreatmentNH4+PO4:DayF28 -0.545 -0.523 -0.306 -0.257
## TreatmentNH4:DayF62 -0.688 -0.621 -0.357 -0.300
## TreatmentNH4+PO4:DayF62 -0.688 -0.621 -0.357 -0.300
## TreatmentNH4:DayF75 -0.621 -0.688 -0.335 -0.281
## TreatmentNH4+PO4:DayF75 -0.621 -0.688 -0.335 -0.281
## TreatmentNH4:GenotypeGreen and Orange -0.367 -0.345 -0.707 -0.281
## TreatmentNH4+PO4:GenotypeGreen and Orange -0.367 -0.345 -0.707 -0.281
## TreatmentNH4:GenotypeOrange -0.314 -0.295 -0.286 -0.721
## TreatmentNH4+PO4:GenotypeOrange -0.305 -0.287 -0.278 -0.701
## TreatmentNH4:GenotypeRed and Orange -0.362 -0.340 -0.331 -0.277
## TreatmentNH4+PO4:GenotypeRed and Orange -0.357 -0.335 -0.325 -0.273
## TreatmentNH4:GenotypeRed and Yellow -0.283 -0.266 -0.258 -0.217
## TreatmentNH4+PO4:GenotypeRed and Yellow -0.293 -0.275 -0.268 -0.225
## TreatmentNH4:GenotypeYellow -0.222 -0.209 -0.203 -0.170
## TreatmentNH4+PO4:GenotypeYellow -0.222 -0.209 -0.203 -0.170
## DayF28:GenotypeGreen and Orange -0.539 -0.517 -0.638 -0.254
## DayF62:GenotypeGreen and Orange -0.688 -0.621 -0.755 -0.300
## DayF75:GenotypeGreen and Orange -0.621 -0.688 -0.708 -0.281
## DayF28:GenotypeOrange -0.457 -0.439 -0.257 -0.646
## DayF62:GenotypeOrange -0.577 -0.521 -0.300 -0.755
## DayF75:GenotypeOrange -0.521 -0.577 -0.281 -0.708
## DayF28:GenotypeRed and Orange -0.545 -0.523 -0.306 -0.257
## DayF62:GenotypeRed and Orange -0.685 -0.618 -0.356 -0.298
## DayF75:GenotypeRed and Orange -0.621 -0.688 -0.335 -0.281
## DayF28:GenotypeRed and Yellow -0.423 -0.406 -0.238 -0.199
## DayF62:GenotypeRed and Yellow -0.535 -0.482 -0.278 -0.233
## DayF75:GenotypeRed and Yellow -0.482 -0.535 -0.261 -0.219
## DayF28:GenotypeYellow -0.323 -0.310 -0.181 -0.152
## DayF62:GenotypeYellow -0.408 -0.368 -0.212 -0.178
## DayF75:GenotypeYellow -0.368 -0.408 -0.199 -0.167
## TreatmentNH4:DayF28:GenotypeGreen and Orange 0.383 0.368 0.454 0.180
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange 0.383 0.368 0.454 0.180
## TreatmentNH4:DayF62:GenotypeGreen and Orange 0.487 0.439 0.534 0.212
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.487 0.439 0.534 0.212
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.439 0.487 0.501 0.199
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.439 0.487 0.501 0.199
## TreatmentNH4:DayF28:GenotypeOrange 0.329 0.316 0.185 0.465
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.320 0.307 0.180 0.452
## TreatmentNH4:DayF62:GenotypeOrange 0.416 0.375 0.216 0.544
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.405 0.365 0.210 0.529
## TreatmentNH4:DayF75:GenotypeOrange 0.375 0.416 0.203 0.510
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.365 0.405 0.197 0.496
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.380 0.365 0.213 0.179
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.374 0.359 0.210 0.176
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.479 0.432 0.249 0.209
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.472 0.426 0.245 0.206
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.432 0.479 0.234 0.196
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.427 0.473 0.231 0.193
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.297 0.285 0.167 0.140
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.308 0.296 0.173 0.145
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.375 0.338 0.195 0.163
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.385 0.347 0.200 0.168
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.310 0.344 0.168 0.141
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.346 0.384 0.187 0.157
## TreatmentNH4:DayF28:GenotypeYellow 0.230 0.221 0.129 0.108
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.230 0.221 0.129 0.108
## TreatmentNH4:DayF62:GenotypeYellow 0.298 0.269 0.155 0.130
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.298 0.269 0.155 0.130
## TreatmentNH4:DayF75:GenotypeYellow 0.266 0.295 0.144 0.121
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.266 0.295 0.144 0.121
## GntRaO GntRaY GntypY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow 0.368
## GenotypeYellow 0.281 0.218
## TreatmentNH4:DayF28 -0.306 -0.238 -0.181
## TreatmentNH4+PO4:DayF28 -0.306 -0.238 -0.181
## TreatmentNH4:DayF62 -0.357 -0.278 -0.212
## TreatmentNH4+PO4:DayF62 -0.357 -0.278 -0.212
## TreatmentNH4:DayF75 -0.335 -0.261 -0.199
## TreatmentNH4+PO4:DayF75 -0.335 -0.261 -0.199
## TreatmentNH4:GenotypeGreen and Orange -0.335 -0.260 -0.199
## TreatmentNH4+PO4:GenotypeGreen and Orange -0.335 -0.260 -0.199
## TreatmentNH4:GenotypeOrange -0.286 -0.222 -0.170
## TreatmentNH4+PO4:GenotypeOrange -0.278 -0.216 -0.165
## TreatmentNH4:GenotypeRed and Orange -0.698 -0.257 -0.196
## TreatmentNH4+PO4:GenotypeRed and Orange -0.687 -0.253 -0.193
## TreatmentNH4:GenotypeRed and Yellow -0.258 -0.702 -0.153
## TreatmentNH4+PO4:GenotypeRed and Yellow -0.268 -0.728 -0.159
## TreatmentNH4:GenotypeYellow -0.203 -0.157 -0.721
## TreatmentNH4+PO4:GenotypeYellow -0.203 -0.157 -0.721
## DayF28:GenotypeGreen and Orange -0.302 -0.235 -0.179
## DayF62:GenotypeGreen and Orange -0.357 -0.278 -0.212
## DayF75:GenotypeGreen and Orange -0.335 -0.261 -0.199
## DayF28:GenotypeOrange -0.257 -0.199 -0.152
## DayF62:GenotypeOrange -0.300 -0.233 -0.178
## DayF75:GenotypeOrange -0.281 -0.219 -0.167
## DayF28:GenotypeRed and Orange -0.646 -0.238 -0.181
## DayF62:GenotypeRed and Orange -0.751 -0.276 -0.211
## DayF75:GenotypeRed and Orange -0.708 -0.261 -0.199
## DayF28:GenotypeRed and Yellow -0.238 -0.646 -0.141
## DayF62:GenotypeRed and Yellow -0.278 -0.755 -0.165
## DayF75:GenotypeRed and Yellow -0.261 -0.708 -0.155
## DayF28:GenotypeYellow -0.181 -0.141 -0.646
## DayF62:GenotypeYellow -0.212 -0.165 -0.755
## DayF75:GenotypeYellow -0.199 -0.155 -0.708
## TreatmentNH4:DayF28:GenotypeGreen and Orange 0.215 0.167 0.128
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange 0.215 0.167 0.128
## TreatmentNH4:DayF62:GenotypeGreen and Orange 0.253 0.196 0.150
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.253 0.196 0.150
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.237 0.184 0.141
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.237 0.184 0.141
## TreatmentNH4:DayF28:GenotypeOrange 0.185 0.144 0.110
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.180 0.140 0.107
## TreatmentNH4:DayF62:GenotypeOrange 0.216 0.168 0.128
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.210 0.163 0.125
## TreatmentNH4:DayF75:GenotypeOrange 0.203 0.158 0.120
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.197 0.153 0.117
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.451 0.166 0.127
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.444 0.163 0.125
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.525 0.193 0.148
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.517 0.190 0.145
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.493 0.181 0.139
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.487 0.179 0.137
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.167 0.453 0.099
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.173 0.470 0.103
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.195 0.529 0.116
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.200 0.544 0.119
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.168 0.456 0.099
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.187 0.509 0.111
## TreatmentNH4:DayF28:GenotypeYellow 0.129 0.100 0.459
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.129 0.100 0.459
## TreatmentNH4:DayF62:GenotypeYellow 0.155 0.120 0.550
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.155 0.120 0.550
## TreatmentNH4:DayF75:GenotypeYellow 0.144 0.112 0.512
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.144 0.112 0.512
## TrNH4:DF28 TrNH4+PO4:DF28
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28 0.474
## TreatmentNH4:DayF62 0.792 0.375
## TreatmentNH4+PO4:DayF62 0.375 0.792
## TreatmentNH4:DayF75 0.760 0.360
## TreatmentNH4+PO4:DayF75 0.360 0.760
## TreatmentNH4:GenotypeGreen and Orange 0.457 0.216
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.216 0.457
## TreatmentNH4:GenotypeOrange 0.390 0.185
## TreatmentNH4+PO4:GenotypeOrange 0.180 0.380
## TreatmentNH4:GenotypeRed and Orange 0.451 0.213
## TreatmentNH4+PO4:GenotypeRed and Orange 0.210 0.444
## TreatmentNH4:GenotypeRed and Yellow 0.352 0.167
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.173 0.365
## TreatmentNH4:GenotypeYellow 0.276 0.131
## TreatmentNH4+PO4:GenotypeYellow 0.131 0.276
## DayF28:GenotypeGreen and Orange 0.468 0.468
## DayF62:GenotypeGreen and Orange 0.375 0.375
## DayF75:GenotypeGreen and Orange 0.360 0.360
## DayF28:GenotypeOrange 0.397 0.397
## DayF62:GenotypeOrange 0.315 0.315
## DayF75:GenotypeOrange 0.302 0.302
## DayF28:GenotypeRed and Orange 0.474 0.474
## DayF62:GenotypeRed and Orange 0.373 0.373
## DayF75:GenotypeRed and Orange 0.360 0.360
## DayF28:GenotypeRed and Yellow 0.368 0.368
## DayF62:GenotypeRed and Yellow 0.291 0.291
## DayF75:GenotypeRed and Yellow 0.280 0.280
## DayF28:GenotypeYellow 0.281 0.281
## DayF62:GenotypeYellow 0.223 0.223
## DayF75:GenotypeYellow 0.214 0.214
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.703 -0.333
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.333 -0.703
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.560 -0.265
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.265 -0.560
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.537 -0.255
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.255 -0.537
## TreatmentNH4:DayF28:GenotypeOrange -0.604 -0.286
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.278 -0.588
## TreatmentNH4:DayF62:GenotypeOrange -0.479 -0.227
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.220 -0.465
## TreatmentNH4:DayF75:GenotypeOrange -0.459 -0.218
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.212 -0.447
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.698 -0.331
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.325 -0.687
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.552 -0.261
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.257 -0.543
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.529 -0.251
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.247 -0.522
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.545 -0.258
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.268 -0.565
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.431 -0.204
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.210 -0.443
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.380 -0.180
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.201 -0.424
## TreatmentNH4:DayF28:GenotypeYellow -0.422 -0.200
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.200 -0.422
## TreatmentNH4:DayF62:GenotypeYellow -0.342 -0.162
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.162 -0.342
## TreatmentNH4:DayF75:GenotypeYellow -0.326 -0.155
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.155 -0.326
## TrNH4:DF62 TrNH4+PO4:DF62
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62 0.474
## TreatmentNH4:DayF75 0.902 0.427
## TreatmentNH4+PO4:DayF75 0.427 0.902
## TreatmentNH4:GenotypeGreen and Orange 0.534 0.253
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.253 0.534
## TreatmentNH4:GenotypeOrange 0.456 0.216
## TreatmentNH4+PO4:GenotypeOrange 0.210 0.444
## TreatmentNH4:GenotypeRed and Orange 0.527 0.249
## TreatmentNH4+PO4:GenotypeRed and Orange 0.246 0.518
## TreatmentNH4:GenotypeRed and Yellow 0.411 0.195
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.202 0.426
## TreatmentNH4:GenotypeYellow 0.323 0.153
## TreatmentNH4+PO4:GenotypeYellow 0.153 0.323
## DayF28:GenotypeGreen and Orange 0.371 0.371
## DayF62:GenotypeGreen and Orange 0.474 0.474
## DayF75:GenotypeGreen and Orange 0.427 0.427
## DayF28:GenotypeOrange 0.315 0.315
## DayF62:GenotypeOrange 0.397 0.397
## DayF75:GenotypeOrange 0.359 0.359
## DayF28:GenotypeRed and Orange 0.375 0.375
## DayF62:GenotypeRed and Orange 0.471 0.471
## DayF75:GenotypeRed and Orange 0.427 0.427
## DayF28:GenotypeRed and Yellow 0.291 0.291
## DayF62:GenotypeRed and Yellow 0.368 0.368
## DayF75:GenotypeRed and Yellow 0.332 0.332
## DayF28:GenotypeYellow 0.223 0.223
## DayF62:GenotypeYellow 0.281 0.281
## DayF75:GenotypeYellow 0.254 0.254
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.557 -0.264
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.264 -0.557
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.707 -0.335
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.335 -0.707
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.638 -0.302
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.302 -0.638
## TreatmentNH4:DayF28:GenotypeOrange -0.479 -0.227
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.220 -0.465
## TreatmentNH4:DayF62:GenotypeOrange -0.604 -0.286
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.278 -0.588
## TreatmentNH4:DayF75:GenotypeOrange -0.545 -0.258
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.251 -0.530
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.553 -0.262
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.258 -0.544
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.696 -0.330
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.325 -0.686
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.628 -0.297
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.294 -0.620
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.431 -0.204
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.212 -0.448
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.545 -0.258
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.265 -0.559
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.451 -0.214
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.238 -0.503
## TreatmentNH4:DayF28:GenotypeYellow -0.334 -0.158
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.158 -0.334
## TreatmentNH4:DayF62:GenotypeYellow -0.432 -0.205
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.205 -0.432
## TreatmentNH4:DayF75:GenotypeYellow -0.387 -0.183
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.183 -0.387
## TrNH4:DF75 TrNH4+PO4:DF75
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75 0.474
## TreatmentNH4:GenotypeGreen and Orange 0.501 0.237
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.237 0.501
## TreatmentNH4:GenotypeOrange 0.428 0.203
## TreatmentNH4+PO4:GenotypeOrange 0.197 0.416
## TreatmentNH4:GenotypeRed and Orange 0.494 0.234
## TreatmentNH4+PO4:GenotypeRed and Orange 0.231 0.487
## TreatmentNH4:GenotypeRed and Yellow 0.386 0.183
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.190 0.400
## TreatmentNH4:GenotypeYellow 0.303 0.144
## TreatmentNH4+PO4:GenotypeYellow 0.144 0.303
## DayF28:GenotypeGreen and Orange 0.356 0.356
## DayF62:GenotypeGreen and Orange 0.427 0.427
## DayF75:GenotypeGreen and Orange 0.474 0.474
## DayF28:GenotypeOrange 0.302 0.302
## DayF62:GenotypeOrange 0.359 0.359
## DayF75:GenotypeOrange 0.397 0.397
## DayF28:GenotypeRed and Orange 0.360 0.360
## DayF62:GenotypeRed and Orange 0.425 0.425
## DayF75:GenotypeRed and Orange 0.474 0.474
## DayF28:GenotypeRed and Yellow 0.280 0.280
## DayF62:GenotypeRed and Yellow 0.332 0.332
## DayF75:GenotypeRed and Yellow 0.368 0.368
## DayF28:GenotypeYellow 0.214 0.214
## DayF62:GenotypeYellow 0.254 0.254
## DayF75:GenotypeYellow 0.281 0.281
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.534 -0.253
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.253 -0.534
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.638 -0.302
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.302 -0.638
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.707 -0.335
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.335 -0.707
## TreatmentNH4:DayF28:GenotypeOrange -0.459 -0.218
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.212 -0.447
## TreatmentNH4:DayF62:GenotypeOrange -0.545 -0.258
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.251 -0.530
## TreatmentNH4:DayF75:GenotypeOrange -0.604 -0.286
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.278 -0.588
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.531 -0.251
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.247 -0.522
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.628 -0.298
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.293 -0.619
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.696 -0.330
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.325 -0.687
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.414 -0.196
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.203 -0.430
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.492 -0.233
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.239 -0.505
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.500 -0.237
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.264 -0.558
## TreatmentNH4:DayF28:GenotypeYellow -0.321 -0.152
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.152 -0.321
## TreatmentNH4:DayF62:GenotypeYellow -0.390 -0.185
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.185 -0.390
## TreatmentNH4:DayF75:GenotypeYellow -0.429 -0.203
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.203 -0.429
## TNH4:GGaO TNH4+PO4:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.500
## TreatmentNH4:GenotypeOrange 0.427 0.202
## TreatmentNH4+PO4:GenotypeOrange 0.197 0.416
## TreatmentNH4:GenotypeRed and Orange 0.494 0.234
## TreatmentNH4+PO4:GenotypeRed and Orange 0.230 0.486
## TreatmentNH4:GenotypeRed and Yellow 0.385 0.182
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.189 0.400
## TreatmentNH4:GenotypeYellow 0.303 0.143
## TreatmentNH4+PO4:GenotypeYellow 0.143 0.303
## DayF28:GenotypeGreen and Orange 0.451 0.451
## DayF62:GenotypeGreen and Orange 0.534 0.534
## DayF75:GenotypeGreen and Orange 0.501 0.501
## DayF28:GenotypeOrange 0.181 0.181
## DayF62:GenotypeOrange 0.212 0.212
## DayF75:GenotypeOrange 0.199 0.199
## DayF28:GenotypeRed and Orange 0.216 0.216
## DayF62:GenotypeRed and Orange 0.252 0.252
## DayF75:GenotypeRed and Orange 0.237 0.237
## DayF28:GenotypeRed and Yellow 0.168 0.168
## DayF62:GenotypeRed and Yellow 0.196 0.196
## DayF75:GenotypeRed and Yellow 0.184 0.184
## DayF28:GenotypeYellow 0.128 0.128
## DayF62:GenotypeYellow 0.150 0.150
## DayF75:GenotypeYellow 0.141 0.141
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.642 -0.321
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.321 -0.642
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.755 -0.377
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.377 -0.755
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.708 -0.354
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.354 -0.708
## TreatmentNH4:DayF28:GenotypeOrange -0.276 -0.131
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.127 -0.268
## TreatmentNH4:DayF62:GenotypeOrange -0.323 -0.153
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.149 -0.314
## TreatmentNH4:DayF75:GenotypeOrange -0.303 -0.143
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.139 -0.294
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.319 -0.151
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.149 -0.314
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.372 -0.176
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.173 -0.366
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.349 -0.165
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.163 -0.344
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.249 -0.118
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.122 -0.258
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.291 -0.138
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.141 -0.298
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.250 -0.119
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.132 -0.279
## TreatmentNH4:DayF28:GenotypeYellow -0.193 -0.091
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.091 -0.193
## TreatmentNH4:DayF62:GenotypeYellow -0.231 -0.109
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.109 -0.231
## TreatmentNH4:DayF75:GenotypeYellow -0.215 -0.102
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.102 -0.215
## TNH4:GO TNH4+PO4:GO TNH4:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange 0.505
## TreatmentNH4:GenotypeRed and Orange 0.422 0.194
## TreatmentNH4+PO4:GenotypeRed and Orange 0.197 0.404 0.480
## TreatmentNH4:GenotypeRed and Yellow 0.329 0.152 0.380
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.162 0.332 0.187
## TreatmentNH4:GenotypeYellow 0.259 0.119 0.299
## TreatmentNH4+PO4:GenotypeYellow 0.123 0.252 0.141
## DayF28:GenotypeGreen and Orange 0.183 0.178 0.211
## DayF62:GenotypeGreen and Orange 0.216 0.210 0.249
## DayF75:GenotypeGreen and Orange 0.203 0.197 0.234
## DayF28:GenotypeOrange 0.465 0.452 0.179
## DayF62:GenotypeOrange 0.544 0.529 0.209
## DayF75:GenotypeOrange 0.510 0.496 0.196
## DayF28:GenotypeRed and Orange 0.185 0.180 0.451
## DayF62:GenotypeRed and Orange 0.215 0.209 0.524
## DayF75:GenotypeRed and Orange 0.203 0.197 0.494
## DayF28:GenotypeRed and Yellow 0.144 0.140 0.166
## DayF62:GenotypeRed and Yellow 0.168 0.163 0.194
## DayF75:GenotypeRed and Yellow 0.158 0.153 0.182
## DayF28:GenotypeYellow 0.110 0.107 0.127
## DayF62:GenotypeYellow 0.128 0.125 0.148
## DayF75:GenotypeYellow 0.120 0.117 0.139
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.274 -0.126 -0.317
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.130 -0.267 -0.150
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.323 -0.149 -0.372
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.153 -0.314 -0.176
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.303 -0.139 -0.350
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.143 -0.294 -0.166
## TreatmentNH4:DayF28:GenotypeOrange -0.646 -0.326 -0.272
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.326 -0.646 -0.125
## TreatmentNH4:DayF62:GenotypeOrange -0.755 -0.381 -0.318
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.381 -0.755 -0.147
## TreatmentNH4:DayF75:GenotypeOrange -0.708 -0.358 -0.299
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.358 -0.708 -0.138
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.272 -0.125 -0.646
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.127 -0.261 -0.310
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.318 -0.146 -0.753
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.148 -0.304 -0.361
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.298 -0.137 -0.706
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.139 -0.286 -0.340
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.213 -0.098 -0.246
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.104 -0.214 -0.121
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.249 -0.114 -0.287
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.121 -0.248 -0.140
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.214 -0.099 -0.247
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.113 -0.232 -0.131
## TreatmentNH4:DayF28:GenotypeYellow -0.165 -0.076 -0.190
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.078 -0.160 -0.090
## TreatmentNH4:DayF62:GenotypeYellow -0.197 -0.091 -0.228
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.093 -0.192 -0.108
## TreatmentNH4:DayF75:GenotypeYellow -0.184 -0.085 -0.212
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.087 -0.179 -0.100
## TNH4+PO4:GRaO TNH4:GaY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow 0.177
## TreatmentNH4+PO4:GenotypeRed and Yellow 0.388 0.510
## TreatmentNH4:GenotypeYellow 0.139 0.233
## TreatmentNH4+PO4:GenotypeYellow 0.294 0.110
## DayF28:GenotypeGreen and Orange 0.208 0.165
## DayF62:GenotypeGreen and Orange 0.246 0.195
## DayF75:GenotypeGreen and Orange 0.231 0.183
## DayF28:GenotypeOrange 0.176 0.140
## DayF62:GenotypeOrange 0.206 0.163
## DayF75:GenotypeOrange 0.193 0.153
## DayF28:GenotypeRed and Orange 0.444 0.167
## DayF62:GenotypeRed and Orange 0.516 0.194
## DayF75:GenotypeRed and Orange 0.487 0.183
## DayF28:GenotypeRed and Yellow 0.163 0.453
## DayF62:GenotypeRed and Yellow 0.191 0.529
## DayF75:GenotypeRed and Yellow 0.179 0.497
## DayF28:GenotypeYellow 0.125 0.099
## DayF62:GenotypeYellow 0.146 0.116
## DayF75:GenotypeYellow 0.137 0.108
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.148 -0.247
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.312 -0.117
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.174 -0.291
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.367 -0.138
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.163 -0.273
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.344 -0.129
## TreatmentNH4:DayF28:GenotypeOrange -0.127 -0.213
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.261 -0.098
## TreatmentNH4:DayF62:GenotypeOrange -0.148 -0.249
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.305 -0.114
## TreatmentNH4:DayF75:GenotypeOrange -0.139 -0.233
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.286 -0.107
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.310 -0.246
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.646 -0.115
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.361 -0.286
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.753 -0.134
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.339 -0.269
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.708 -0.126
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.115 -0.646
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.251 -0.330
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.134 -0.755
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.290 -0.381
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.115 -0.650
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.272 -0.357
## TreatmentNH4:DayF28:GenotypeYellow -0.089 -0.149
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.187 -0.070
## TreatmentNH4:DayF62:GenotypeYellow -0.106 -0.178
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.224 -0.084
## TreatmentNH4:DayF75:GenotypeYellow -0.099 -0.166
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.209 -0.078
## TNH4+PO4:GaY TNH4:GY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow 0.115
## TreatmentNH4+PO4:GenotypeYellow 0.242 0.520
## DayF28:GenotypeGreen and Orange 0.171 0.129
## DayF62:GenotypeGreen and Orange 0.202 0.153
## DayF75:GenotypeGreen and Orange 0.190 0.144
## DayF28:GenotypeOrange 0.145 0.110
## DayF62:GenotypeOrange 0.169 0.128
## DayF75:GenotypeOrange 0.159 0.120
## DayF28:GenotypeRed and Orange 0.173 0.131
## DayF62:GenotypeRed and Orange 0.201 0.152
## DayF75:GenotypeRed and Orange 0.190 0.144
## DayF28:GenotypeRed and Yellow 0.470 0.102
## DayF62:GenotypeRed and Yellow 0.549 0.119
## DayF75:GenotypeRed and Yellow 0.515 0.112
## DayF28:GenotypeYellow 0.103 0.466
## DayF62:GenotypeYellow 0.120 0.544
## DayF75:GenotypeYellow 0.112 0.511
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.122 -0.194
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.257 -0.092
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.143 -0.228
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.302 -0.108
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.134 -0.214
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.283 -0.102
## TreatmentNH4:DayF28:GenotypeOrange -0.104 -0.167
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.214 -0.077
## TreatmentNH4:DayF62:GenotypeOrange -0.122 -0.195
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.251 -0.090
## TreatmentNH4:DayF75:GenotypeOrange -0.115 -0.183
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.235 -0.084
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.121 -0.193
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.251 -0.090
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.141 -0.225
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.292 -0.105
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.132 -0.211
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.275 -0.099
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.330 -0.151
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.646 -0.074
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.385 -0.176
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.747 -0.086
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.332 -0.151
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.699 -0.080
## TreatmentNH4:DayF28:GenotypeYellow -0.073 -0.683
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.154 -0.331
## TreatmentNH4:DayF62:GenotypeYellow -0.087 -0.775
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.184 -0.397
## TreatmentNH4:DayF75:GenotypeYellow -0.081 -0.735
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.172 -0.370
## TNH4+PO4:GY DF28:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange 0.129
## DayF62:GenotypeGreen and Orange 0.153 0.783
## DayF75:GenotypeGreen and Orange 0.144 0.751
## DayF28:GenotypeOrange 0.110 0.393
## DayF62:GenotypeOrange 0.128 0.311
## DayF75:GenotypeOrange 0.120 0.299
## DayF28:GenotypeRed and Orange 0.131 0.468
## DayF62:GenotypeRed and Orange 0.152 0.369
## DayF75:GenotypeRed and Orange 0.144 0.356
## DayF28:GenotypeRed and Yellow 0.102 0.364
## DayF62:GenotypeRed and Yellow 0.119 0.288
## DayF75:GenotypeRed and Yellow 0.112 0.276
## DayF28:GenotypeYellow 0.466 0.278
## DayF62:GenotypeYellow 0.544 0.220
## DayF75:GenotypeYellow 0.511 0.211
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.092 -0.711
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.194 -0.711
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.108 -0.554
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.228 -0.554
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.102 -0.531
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.214 -0.531
## TreatmentNH4:DayF28:GenotypeOrange -0.079 -0.283
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.162 -0.275
## TreatmentNH4:DayF62:GenotypeOrange -0.092 -0.224
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.190 -0.218
## TreatmentNH4:DayF75:GenotypeOrange -0.087 -0.215
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.178 -0.209
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.091 -0.327
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.190 -0.322
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.107 -0.258
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.221 -0.254
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.100 -0.248
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.208 -0.245
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.071 -0.255
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.156 -0.265
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.083 -0.202
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.181 -0.207
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.072 -0.178
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.169 -0.199
## TreatmentNH4:DayF28:GenotypeYellow -0.331 -0.198
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.683 -0.198
## TreatmentNH4:DayF62:GenotypeYellow -0.397 -0.160
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.775 -0.160
## TreatmentNH4:DayF75:GenotypeYellow -0.370 -0.153
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.735 -0.153
## DF62:GGaO DF75:GGaO DF28:GO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange 0.902
## DayF28:GenotypeOrange 0.315 0.302
## DayF62:GenotypeOrange 0.397 0.359 0.792
## DayF75:GenotypeOrange 0.359 0.397 0.760
## DayF28:GenotypeRed and Orange 0.375 0.360 0.397
## DayF62:GenotypeRed and Orange 0.471 0.425 0.313
## DayF75:GenotypeRed and Orange 0.427 0.474 0.302
## DayF28:GenotypeRed and Yellow 0.291 0.280 0.309
## DayF62:GenotypeRed and Yellow 0.368 0.332 0.244
## DayF75:GenotypeRed and Yellow 0.332 0.368 0.235
## DayF28:GenotypeYellow 0.223 0.214 0.236
## DayF62:GenotypeYellow 0.281 0.254 0.187
## DayF75:GenotypeYellow 0.254 0.281 0.179
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.557 -0.534 -0.279
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.557 -0.534 -0.279
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.707 -0.638 -0.223
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.707 -0.638 -0.223
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.638 -0.707 -0.214
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.638 -0.707 -0.214
## TreatmentNH4:DayF28:GenotypeOrange -0.227 -0.218 -0.721
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.220 -0.212 -0.701
## TreatmentNH4:DayF62:GenotypeOrange -0.286 -0.258 -0.571
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.278 -0.251 -0.555
## TreatmentNH4:DayF75:GenotypeOrange -0.258 -0.286 -0.548
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.251 -0.278 -0.533
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.262 -0.251 -0.277
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.258 -0.247 -0.273
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.330 -0.298 -0.219
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.325 -0.293 -0.216
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.297 -0.330 -0.210
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.294 -0.325 -0.208
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.204 -0.196 -0.217
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.212 -0.203 -0.225
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.258 -0.233 -0.171
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.265 -0.239 -0.176
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.214 -0.237 -0.151
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.238 -0.264 -0.169
## TreatmentNH4:DayF28:GenotypeYellow -0.158 -0.152 -0.168
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.158 -0.152 -0.168
## TreatmentNH4:DayF62:GenotypeYellow -0.205 -0.185 -0.136
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.205 -0.185 -0.136
## TreatmentNH4:DayF75:GenotypeYellow -0.183 -0.203 -0.130
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.183 -0.203 -0.130
## DF62:GO DF75:GO DF28:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange 0.902
## DayF28:GenotypeRed and Orange 0.315 0.302
## DayF62:GenotypeRed and Orange 0.396 0.357 0.788
## DayF75:GenotypeRed and Orange 0.359 0.397 0.760
## DayF28:GenotypeRed and Yellow 0.244 0.235 0.368
## DayF62:GenotypeRed and Yellow 0.309 0.278 0.291
## DayF75:GenotypeRed and Yellow 0.278 0.309 0.280
## DayF28:GenotypeYellow 0.187 0.179 0.281
## DayF62:GenotypeYellow 0.236 0.213 0.223
## DayF75:GenotypeYellow 0.213 0.236 0.214
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.221 -0.212 -0.333
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.221 -0.212 -0.333
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.281 -0.254 -0.265
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.281 -0.254 -0.265
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.254 -0.281 -0.255
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.254 -0.281 -0.255
## TreatmentNH4:DayF28:GenotypeOrange -0.571 -0.548 -0.286
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.555 -0.533 -0.278
## TreatmentNH4:DayF62:GenotypeOrange -0.721 -0.650 -0.227
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.701 -0.632 -0.220
## TreatmentNH4:DayF75:GenotypeOrange -0.650 -0.721 -0.218
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.632 -0.701 -0.212
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.220 -0.211 -0.698
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.216 -0.208 -0.687
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.277 -0.250 -0.552
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.272 -0.246 -0.543
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.250 -0.277 -0.529
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.246 -0.273 -0.522
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.171 -0.165 -0.258
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.178 -0.171 -0.268
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.217 -0.195 -0.204
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.222 -0.201 -0.210
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.179 -0.199 -0.180
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.200 -0.222 -0.201
## TreatmentNH4:DayF28:GenotypeYellow -0.133 -0.127 -0.200
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.133 -0.127 -0.200
## TreatmentNH4:DayF62:GenotypeYellow -0.172 -0.155 -0.162
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.172 -0.155 -0.162
## TreatmentNH4:DayF75:GenotypeYellow -0.154 -0.171 -0.155
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.154 -0.171 -0.155
## DF62:GRaO DF75:GRaO DF28aY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange 0.898
## DayF28:GenotypeRed and Yellow 0.290 0.280
## DayF62:GenotypeRed and Yellow 0.366 0.332 0.792
## DayF75:GenotypeRed and Yellow 0.330 0.368 0.760
## DayF28:GenotypeYellow 0.221 0.214 0.218
## DayF62:GenotypeYellow 0.280 0.254 0.173
## DayF75:GenotypeYellow 0.252 0.281 0.166
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.262 -0.253 -0.259
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.262 -0.253 -0.259
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.333 -0.302 -0.206
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.333 -0.302 -0.206
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.301 -0.335 -0.198
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.301 -0.335 -0.198
## TreatmentNH4:DayF28:GenotypeOrange -0.226 -0.218 -0.222
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.219 -0.212 -0.216
## TreatmentNH4:DayF62:GenotypeOrange -0.285 -0.258 -0.176
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.277 -0.251 -0.171
## TreatmentNH4:DayF75:GenotypeOrange -0.257 -0.286 -0.169
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.250 -0.278 -0.164
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.550 -0.531 -0.257
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.542 -0.522 -0.253
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.700 -0.628 -0.203
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.689 -0.619 -0.200
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.625 -0.696 -0.195
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.617 -0.687 -0.192
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.203 -0.196 -0.702
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.211 -0.203 -0.728
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.257 -0.233 -0.556
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.264 -0.239 -0.570
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.213 -0.237 -0.489
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.237 -0.264 -0.546
## TreatmentNH4:DayF28:GenotypeYellow -0.158 -0.152 -0.155
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.158 -0.152 -0.155
## TreatmentNH4:DayF62:GenotypeYellow -0.204 -0.185 -0.126
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.204 -0.185 -0.126
## TreatmentNH4:DayF75:GenotypeYellow -0.183 -0.203 -0.120
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.183 -0.203 -0.120
## DF62aY DF75aY DF28:GY DF62:GY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow 0.902
## DayF28:GenotypeYellow 0.173 0.166
## DayF62:GenotypeYellow 0.218 0.197 0.792
## DayF75:GenotypeYellow 0.197 0.218 0.760 0.902
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.205 -0.197 -0.198 -0.156
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.205 -0.197 -0.198 -0.156
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.260 -0.235 -0.157 -0.199
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.260 -0.235 -0.157 -0.199
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.235 -0.260 -0.151 -0.179
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.235 -0.260 -0.151 -0.179
## TreatmentNH4:DayF28:GenotypeOrange -0.176 -0.169 -0.170 -0.135
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.171 -0.164 -0.165 -0.131
## TreatmentNH4:DayF62:GenotypeOrange -0.222 -0.201 -0.135 -0.170
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.216 -0.195 -0.131 -0.165
## TreatmentNH4:DayF75:GenotypeOrange -0.201 -0.222 -0.129 -0.153
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.195 -0.216 -0.126 -0.149
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.203 -0.195 -0.196 -0.155
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.200 -0.192 -0.193 -0.153
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.256 -0.231 -0.155 -0.196
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.252 -0.228 -0.153 -0.193
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.231 -0.256 -0.149 -0.176
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.228 -0.253 -0.147 -0.174
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.556 -0.533 -0.153 -0.121
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.576 -0.553 -0.159 -0.126
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.702 -0.633 -0.121 -0.153
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.720 -0.650 -0.124 -0.157
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.581 -0.643 -0.107 -0.127
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.648 -0.718 -0.119 -0.141
## TreatmentNH4:DayF28:GenotypeYellow -0.123 -0.118 -0.712 -0.564
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.123 -0.118 -0.712 -0.564
## TreatmentNH4:DayF62:GenotypeYellow -0.159 -0.144 -0.577 -0.729
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.159 -0.144 -0.577 -0.729
## TreatmentNH4:DayF75:GenotypeYellow -0.142 -0.158 -0.550 -0.653
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.142 -0.158 -0.550 -0.653
## DF75:GY TNH4:DF28:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.150
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.150 0.506
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.179 0.787
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.179 0.394
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.199 0.756
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.199 0.378
## TreatmentNH4:DayF28:GenotypeOrange -0.129 0.425
## TreatmentNH4+PO4:DayF28:GenotypeOrange -0.126 0.196
## TreatmentNH4:DayF62:GenotypeOrange -0.153 0.337
## TreatmentNH4+PO4:DayF62:GenotypeOrange -0.149 0.155
## TreatmentNH4:DayF75:GenotypeOrange -0.170 0.323
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.165 0.149
## TreatmentNH4:DayF28:GenotypeRed and Orange -0.149 0.491
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.147 0.229
## TreatmentNH4:DayF62:GenotypeRed and Orange -0.177 0.388
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -0.174 0.181
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.196 0.372
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.193 0.174
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.116 0.383
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -0.121 0.188
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.138 0.303
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -0.142 0.148
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.140 0.267
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -0.157 0.141
## TreatmentNH4:DayF28:GenotypeYellow -0.541 0.297
## TreatmentNH4+PO4:DayF28:GenotypeYellow -0.541 0.141
## TreatmentNH4:DayF62:GenotypeYellow -0.658 0.241
## TreatmentNH4+PO4:DayF62:GenotypeYellow -0.658 0.114
## TreatmentNH4:DayF75:GenotypeYellow -0.723 0.229
## TreatmentNH4+PO4:DayF75:GenotypeYellow -0.723 0.109
## TNH4+PO4:DF28:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange 0.394
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.787
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.378
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.756
## TreatmentNH4:DayF28:GenotypeOrange 0.201
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.413
## TreatmentNH4:DayF62:GenotypeOrange 0.159
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.327
## TreatmentNH4:DayF75:GenotypeOrange 0.153
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.314
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.232
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.483
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.184
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.382
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.176
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.367
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.181
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.397
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.144
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.311
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.126
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.298
## TreatmentNH4:DayF28:GenotypeYellow 0.141
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.297
## TreatmentNH4:DayF62:GenotypeYellow 0.114
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.241
## TreatmentNH4:DayF75:GenotypeYellow 0.109
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.229
## TNH4:DF62:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 0.500
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.902
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.451
## TreatmentNH4:DayF28:GenotypeOrange 0.338
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.156
## TreatmentNH4:DayF62:GenotypeOrange 0.427
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.197
## TreatmentNH4:DayF75:GenotypeOrange 0.386
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.178
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.391
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.182
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.492
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.230
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.444
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.208
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.305
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.150
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.385
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.187
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.319
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.169
## TreatmentNH4:DayF28:GenotypeYellow 0.236
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.112
## TreatmentNH4:DayF62:GenotypeYellow 0.306
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.145
## TreatmentNH4:DayF75:GenotypeYellow 0.274
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.130
## TNH4+PO4:DF62:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange 0.451
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.902
## TreatmentNH4:DayF28:GenotypeOrange 0.160
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.329
## TreatmentNH4:DayF62:GenotypeOrange 0.202
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.416
## TreatmentNH4:DayF75:GenotypeOrange 0.183
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.375
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.185
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.385
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.233
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.485
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.210
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.438
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.145
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.316
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.182
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.396
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.151
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.356
## TreatmentNH4:DayF28:GenotypeYellow 0.112
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.236
## TreatmentNH4:DayF62:GenotypeYellow 0.145
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.306
## TreatmentNH4:DayF75:GenotypeYellow 0.130
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.274
## TNH4:DF75:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 0.500
## TreatmentNH4:DayF28:GenotypeOrange 0.325
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.150
## TreatmentNH4:DayF62:GenotypeOrange 0.386
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.178
## TreatmentNH4:DayF75:GenotypeOrange 0.427
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.197
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.375
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.175
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.444
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.207
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.492
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.230
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.293
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.144
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.348
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.169
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.353
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.187
## TreatmentNH4:DayF28:GenotypeYellow 0.227
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.107
## TreatmentNH4:DayF62:GenotypeYellow 0.276
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.131
## TreatmentNH4:DayF75:GenotypeYellow 0.303
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.144
## TNH4+PO4:DF75:GGaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange 0.154
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.316
## TreatmentNH4:DayF62:GenotypeOrange 0.183
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.375
## TreatmentNH4:DayF75:GenotypeOrange 0.202
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.416
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.178
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.369
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.210
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.437
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.233
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.486
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.139
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.304
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.165
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.357
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.167
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.395
## TreatmentNH4:DayF28:GenotypeYellow 0.107
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.227
## TreatmentNH4:DayF62:GenotypeYellow 0.131
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.276
## TreatmentNH4:DayF75:GenotypeYellow 0.144
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.303
## TNH4:DF28:GO TNH4+PO4:DF28:GO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.505
## TreatmentNH4:DayF62:GenotypeOrange 0.792 0.400
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.400 0.792
## TreatmentNH4:DayF75:GenotypeOrange 0.760 0.384
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.384 0.760
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.422 0.194
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.197 0.404
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.333 0.154
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.155 0.319
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.320 0.147
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.150 0.307
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.329 0.152
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.162 0.332
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.261 0.120
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.127 0.260
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.230 0.106
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.121 0.249
## TreatmentNH4:DayF28:GenotypeYellow 0.255 0.118
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.121 0.248
## TreatmentNH4:DayF62:GenotypeYellow 0.207 0.095
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.098 0.201
## TreatmentNH4:DayF75:GenotypeYellow 0.197 0.091
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.093 0.192
## TNH4:DF62:GO TNH4+PO4:DF62:GO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange 0.505
## TreatmentNH4:DayF75:GenotypeOrange 0.902 0.456
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.456 0.902
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.334 0.154
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.156 0.320
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.421 0.194
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.196 0.403
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.380 0.175
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.178 0.364
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.261 0.120
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.128 0.263
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.329 0.152
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.160 0.329
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.273 0.126
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.144 0.296
## TreatmentNH4:DayF28:GenotypeYellow 0.202 0.093
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.096 0.196
## TreatmentNH4:DayF62:GenotypeYellow 0.261 0.120
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.124 0.254
## TreatmentNH4:DayF75:GenotypeYellow 0.234 0.108
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.111 0.228
## TNH4:DF75:GO TNH4+PO4:DF75:GO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange 0.505
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.321 0.148
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.150 0.307
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.380 0.175
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.177 0.364
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.421 0.194
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.197 0.404
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.250 0.115
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.123 0.252
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.297 0.137
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.145 0.297
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.302 0.139
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.160 0.328
## TreatmentNH4:DayF28:GenotypeYellow 0.194 0.089
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.092 0.189
## TreatmentNH4:DayF62:GenotypeYellow 0.236 0.109
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.112 0.229
## TreatmentNH4:DayF75:GenotypeYellow 0.259 0.119
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.123 0.252
## TNH4:DF28:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange 0.480
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.790
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.379
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.758
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.365
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.380
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.187
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.301
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.146
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.265
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.140
## TreatmentNH4:DayF28:GenotypeYellow 0.295
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.140
## TreatmentNH4:DayF62:GenotypeYellow 0.239
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.113
## TreatmentNH4:DayF75:GenotypeYellow 0.228
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.108
## TNH4+PO4:DF28:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange 0.379
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.790
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.363
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.760
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.177
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.388
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.140
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.304
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.124
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.291
## TreatmentNH4:DayF28:GenotypeYellow 0.137
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.290
## TreatmentNH4:DayF62:GenotypeYellow 0.111
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.235
## TreatmentNH4:DayF75:GenotypeYellow 0.106
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.224
## TNH4:DF62:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.482
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.898
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.432
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.300
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.148
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.379
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.185
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.314
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.166
## TreatmentNH4:DayF28:GenotypeYellow 0.233
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.110
## TreatmentNH4:DayF62:GenotypeYellow 0.301
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.143
## TreatmentNH4:DayF75:GenotypeYellow 0.270
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.128
## TNH4+PO4:DF62:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange 0.431
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.900
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.140
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.307
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.177
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.383
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.146
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.345
## TreatmentNH4:DayF28:GenotypeYellow 0.109
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.229
## TreatmentNH4:DayF62:GenotypeYellow 0.140
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.296
## TreatmentNH4:DayF75:GenotypeYellow 0.126
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.265
## TNH4:DF75:GRaO
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 0.478
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.288
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.142
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.342
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.166
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.348
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.184
## TreatmentNH4:DayF28:GenotypeYellow 0.223
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.106
## TreatmentNH4:DayF62:GenotypeYellow 0.272
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.129
## TreatmentNH4:DayF75:GenotypeYellow 0.299
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.141
## TNH4+PO4:DF75:GRaO TNH4:DF2aY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow 0.135
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.295 0.510
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.160 0.792
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.347 0.400
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.163 0.697
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.383 0.383
## TreatmentNH4:DayF28:GenotypeYellow 0.104 0.230
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.220 0.109
## TreatmentNH4:DayF62:GenotypeYellow 0.127 0.187
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.268 0.088
## TreatmentNH4:DayF75:GenotypeYellow 0.140 0.178
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.295 0.084
## TNH4+PO4:DF2aY TNH4:DF6aY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow
## TreatmentNH4:DayF62:GenotypeRed and Yellow 0.404
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 0.784 0.505
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.356 0.827
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.751 0.455
## TreatmentNH4:DayF28:GenotypeYellow 0.113 0.182
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.239 0.086
## TreatmentNH4:DayF62:GenotypeYellow 0.092 0.236
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.193 0.112
## TreatmentNH4:DayF75:GenotypeYellow 0.087 0.211
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.184 0.100
## TNH4+PO4:DF6aY TNH4:DF7aY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow
## TreatmentNH4:DayF62:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow
## TreatmentNH4:DayF75:GenotypeRed and Yellow 0.418
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 0.897 0.462
## TreatmentNH4:DayF28:GenotypeYellow 0.089 0.160
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.187 0.076
## TreatmentNH4:DayF62:GenotypeYellow 0.115 0.195
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.242 0.092
## TreatmentNH4:DayF75:GenotypeYellow 0.103 0.214
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.217 0.102
## TNH4+PO4:DF7aY TNH4:DF28:GY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow
## TreatmentNH4:DayF62:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow
## TreatmentNH4:DayF75:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow
## TreatmentNH4:DayF28:GenotypeYellow 0.085
## TreatmentNH4+PO4:DayF28:GenotypeYellow 0.179 0.506
## TreatmentNH4:DayF62:GenotypeYellow 0.103 0.809
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.218 0.411
## TreatmentNH4:DayF75:GenotypeYellow 0.113 0.784
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.239 0.391
## TNH4+PO4:DF28:GY TNH4:DF62:GY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow
## TreatmentNH4:DayF62:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow
## TreatmentNH4:DayF75:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow
## TreatmentNH4:DayF28:GenotypeYellow
## TreatmentNH4+PO4:DayF28:GenotypeYellow
## TreatmentNH4:DayF62:GenotypeYellow 0.411
## TreatmentNH4+PO4:DayF62:GenotypeYellow 0.809 0.531
## TreatmentNH4:DayF75:GenotypeYellow 0.391 0.910
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.784 0.476
## TNH4+PO4:DF62:GY TNH4:DF75:GY
## TreatmentNH4
## TreatmentNH4+PO4
## DayF28
## DayF62
## DayF75
## GenotypeGreen and Orange
## GenotypeOrange
## GenotypeRed and Orange
## GenotypeRed and Yellow
## GenotypeYellow
## TreatmentNH4:DayF28
## TreatmentNH4+PO4:DayF28
## TreatmentNH4:DayF62
## TreatmentNH4+PO4:DayF62
## TreatmentNH4:DayF75
## TreatmentNH4+PO4:DayF75
## TreatmentNH4:GenotypeGreen and Orange
## TreatmentNH4+PO4:GenotypeGreen and Orange
## TreatmentNH4:GenotypeOrange
## TreatmentNH4+PO4:GenotypeOrange
## TreatmentNH4:GenotypeRed and Orange
## TreatmentNH4+PO4:GenotypeRed and Orange
## TreatmentNH4:GenotypeRed and Yellow
## TreatmentNH4+PO4:GenotypeRed and Yellow
## TreatmentNH4:GenotypeYellow
## TreatmentNH4+PO4:GenotypeYellow
## DayF28:GenotypeGreen and Orange
## DayF62:GenotypeGreen and Orange
## DayF75:GenotypeGreen and Orange
## DayF28:GenotypeOrange
## DayF62:GenotypeOrange
## DayF75:GenotypeOrange
## DayF28:GenotypeRed and Orange
## DayF62:GenotypeRed and Orange
## DayF75:GenotypeRed and Orange
## DayF28:GenotypeRed and Yellow
## DayF62:GenotypeRed and Yellow
## DayF75:GenotypeRed and Yellow
## DayF28:GenotypeYellow
## DayF62:GenotypeYellow
## DayF75:GenotypeYellow
## TreatmentNH4:DayF28:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange
## TreatmentNH4:DayF62:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange
## TreatmentNH4:DayF75:GenotypeGreen and Orange
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange
## TreatmentNH4:DayF28:GenotypeOrange
## TreatmentNH4+PO4:DayF28:GenotypeOrange
## TreatmentNH4:DayF62:GenotypeOrange
## TreatmentNH4+PO4:DayF62:GenotypeOrange
## TreatmentNH4:DayF75:GenotypeOrange
## TreatmentNH4+PO4:DayF75:GenotypeOrange
## TreatmentNH4:DayF28:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange
## TreatmentNH4:DayF62:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange
## TreatmentNH4:DayF75:GenotypeRed and Orange
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange
## TreatmentNH4:DayF28:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow
## TreatmentNH4:DayF62:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow
## TreatmentNH4:DayF75:GenotypeRed and Yellow
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow
## TreatmentNH4:DayF28:GenotypeYellow
## TreatmentNH4+PO4:DayF28:GenotypeYellow
## TreatmentNH4:DayF62:GenotypeYellow
## TreatmentNH4+PO4:DayF62:GenotypeYellow
## TreatmentNH4:DayF75:GenotypeYellow 0.476
## TreatmentNH4+PO4:DayF75:GenotypeYellow 0.910 0.523
##
## Standardized residuals:
## Min Q1 Med Q3 Max
## -4.07050097 -0.46975370 0.05727911 0.54743767 3.76141835
##
## Residual standard error: 0.8395444
## Degrees of freedom: 470 total; 398 residual
intervals(fit3)
## Approximate 95% confidence intervals
##
## Coefficients:
## lower est.
## (Intercept) 2.621777349 3.14371000
## TreatmentNH4 -0.600071671 0.15827889
## TreatmentNH4+PO4 -0.969916115 -0.21156556
## DayF28 0.133995703 0.59241000
## DayF62 0.441195071 1.03142000
## DayF75 0.453201902 0.99141000
## GenotypeGreen and Orange -0.378293893 0.38005667
## GenotypeOrange -0.004363869 0.89965000
## GenotypeRed and Orange -0.169638338 0.58871222
## GenotypeRed and Yellow -0.027881579 0.94856500
## GenotypeYellow -1.030178674 0.24829000
## TreatmentNH4:DayF28 -1.456048310 -0.78998778
## TreatmentNH4+PO4:DayF28 -0.705037198 -0.03897667
## TreatmentNH4:DayF62 -2.524996940 -1.66742000
## TreatmentNH4+PO4:DayF62 -2.233863607 -1.37628667
## TreatmentNH4:DayF75 -3.411419348 -2.62942111
## TreatmentNH4+PO4:DayF75 -2.778463792 -1.99646556
## TreatmentNH4:GenotypeGreen and Orange -1.818165202 -0.74569556
## TreatmentNH4+PO4:GenotypeGreen and Orange -1.309530758 -0.23706111
## TreatmentNH4:GenotypeOrange -1.381292179 -0.12672222
## TreatmentNH4+PO4:GenotypeOrange -0.313006489 0.97724556
## TreatmentNH4:GenotypeRed and Orange -1.025968342 0.06052111
## TreatmentNH4+PO4:GenotypeRed and Orange -0.514570485 0.58919333
## TreatmentNH4:GenotypeRed and Yellow -0.522824291 0.86899611
## TreatmentNH4+PO4:GenotypeRed and Yellow -1.582886905 -0.24088944
## TreatmentNH4:GenotypeYellow -0.588032416 1.18411559
## TreatmentNH4+PO4:GenotypeYellow -0.841757573 0.93039044
## DayF28:GenotypeGreen and Orange -1.172589759 -0.49873909
## DayF62:GenotypeGreen and Orange -1.575552496 -0.71797556
## DayF75:GenotypeGreen and Orange -1.435486015 -0.65348778
## DayF28:GenotypeOrange -0.636926854 0.15707000
## DayF62:GenotypeOrange -1.456999566 -0.43470000
## DayF75:GenotypeOrange -1.867593771 -0.93539000
## DayF28:GenotypeRed and Orange -1.718792754 -1.05273222
## DayF62:GenotypeRed and Orange -3.025928226 -2.16433840
## DayF75:GenotypeRed and Orange -3.015563792 -2.23356556
## DayF28:GenotypeRed and Yellow -1.634299620 -0.77668500
## DayF62:GenotypeRed and Yellow -3.290054733 -2.18584500
## DayF75:GenotypeRed and Yellow -3.371230153 -2.36433500
## DayF28:GenotypeYellow -3.132091119 -2.00921000
## DayF62:GenotypeYellow -3.778569910 -2.33282000
## DayF75:GenotypeYellow -3.639195216 -2.32086000
## TreatmentNH4:DayF28:GenotypeGreen and Orange -0.603889444 0.34358687
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange -0.990090555 -0.04261425
## TreatmentNH4:DayF62:GenotypeGreen and Orange -0.517441384 0.69535556
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange -0.824454718 0.38834222
## TreatmentNH4:DayF75:GenotypeGreen and Orange -0.268943623 0.83696889
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange -0.738659179 0.36725333
## TreatmentNH4:DayF28:GenotypeOrange -2.049516391 -0.94762556
## TreatmentNH4+PO4:DayF28:GenotypeOrange -2.151513806 -1.01828333
## TreatmentNH4:DayF62:GenotypeOrange -2.756290831 -1.33756667
## TreatmentNH4+PO4:DayF62:GenotypeOrange -4.105288409 -2.64621333
## TreatmentNH4:DayF75:GenotypeOrange -2.023173485 -0.72948222
## TreatmentNH4+PO4:DayF75:GenotypeOrange -3.147940472 -1.81745444
## TreatmentNH4:DayF28:GenotypeRed and Orange -1.688555456 -0.73429000
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -2.196413670 -1.22697611
## TreatmentNH4:DayF62:GenotypeRed and Orange -1.339594829 -0.10813938
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange -1.996166224 -0.74521994
## TreatmentNH4:DayF75:GenotypeRed and Orange -0.803718793 0.31986408
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange -0.857136420 0.28104611
## TreatmentNH4:DayF28:GenotypeRed and Yellow -2.549175348 -1.32673722
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow -2.191146889 -1.01246833
## TreatmentNH4:DayF62:GenotypeRed and Yellow -3.492188145 -1.91825500
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow -1.937099796 -0.40401466
## TreatmentNH4:DayF75:GenotypeRed and Yellow -3.130149207 -1.56514565
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow -1.789027039 -0.38744553
## TreatmentNH4:DayF28:GenotypeYellow -1.510322158 0.06769329
## TreatmentNH4+PO4:DayF28:GenotypeYellow -1.802197001 -0.22418155
## TreatmentNH4:DayF62:GenotypeYellow -2.982184400 -0.99880782
## TreatmentNH4+PO4:DayF62:GenotypeYellow -2.139948132 -0.15657155
## TreatmentNH4:DayF75:GenotypeYellow -2.164107594 -0.34182337
## TreatmentNH4+PO4:DayF75:GenotypeYellow -2.037226882 -0.21494266
## upper
## (Intercept) 3.665642651
## TreatmentNH4 0.916629449
## TreatmentNH4+PO4 0.546785004
## DayF28 1.050824297
## DayF62 1.621644929
## DayF75 1.529618098
## GenotypeGreen and Orange 1.138407227
## GenotypeOrange 1.803663869
## GenotypeRed and Orange 1.347062782
## GenotypeRed and Yellow 1.925011579
## GenotypeYellow 1.526758674
## TreatmentNH4:DayF28 -0.123927246
## TreatmentNH4+PO4:DayF28 0.627083865
## TreatmentNH4:DayF62 -0.809843060
## TreatmentNH4+PO4:DayF62 -0.518709726
## TreatmentNH4:DayF75 -1.847422874
## TreatmentNH4+PO4:DayF75 -1.214467319
## TreatmentNH4:GenotypeGreen and Orange 0.326774091
## TreatmentNH4+PO4:GenotypeGreen and Orange 0.835408536
## TreatmentNH4:GenotypeOrange 1.127847734
## TreatmentNH4+PO4:GenotypeOrange 2.267497600
## TreatmentNH4:GenotypeRed and Orange 1.147010564
## TreatmentNH4+PO4:GenotypeRed and Orange 1.692957152
## TreatmentNH4:GenotypeRed and Yellow 2.260816513
## TreatmentNH4+PO4:GenotypeRed and Yellow 1.101108016
## TreatmentNH4:GenotypeYellow 2.956263606
## TreatmentNH4+PO4:GenotypeYellow 2.702538449
## DayF28:GenotypeGreen and Orange 0.175111582
## DayF62:GenotypeGreen and Orange 0.139601385
## DayF75:GenotypeGreen and Orange 0.128510459
## DayF28:GenotypeOrange 0.951066854
## DayF62:GenotypeOrange 0.587599566
## DayF75:GenotypeOrange -0.003186229
## DayF28:GenotypeRed and Orange -0.386671690
## DayF62:GenotypeRed and Orange -1.302748565
## DayF75:GenotypeRed and Orange -1.451567319
## DayF28:GenotypeRed and Yellow 0.080929620
## DayF62:GenotypeRed and Yellow -1.081635267
## DayF75:GenotypeRed and Yellow -1.357439847
## DayF28:GenotypeYellow -0.886328881
## DayF62:GenotypeYellow -0.887070090
## DayF75:GenotypeYellow -1.002524784
## TreatmentNH4:DayF28:GenotypeGreen and Orange 1.291063176
## TreatmentNH4+PO4:DayF28:GenotypeGreen and Orange 0.904862065
## TreatmentNH4:DayF62:GenotypeGreen and Orange 1.908152495
## TreatmentNH4+PO4:DayF62:GenotypeGreen and Orange 1.601139162
## TreatmentNH4:DayF75:GenotypeGreen and Orange 1.942881401
## TreatmentNH4+PO4:DayF75:GenotypeGreen and Orange 1.473165845
## TreatmentNH4:DayF28:GenotypeOrange 0.154265280
## TreatmentNH4+PO4:DayF28:GenotypeOrange 0.114947139
## TreatmentNH4:DayF62:GenotypeOrange 0.081157498
## TreatmentNH4+PO4:DayF62:GenotypeOrange -1.187138257
## TreatmentNH4:DayF75:GenotypeOrange 0.564209041
## TreatmentNH4+PO4:DayF75:GenotypeOrange -0.486968417
## TreatmentNH4:DayF28:GenotypeRed and Orange 0.219975456
## TreatmentNH4+PO4:DayF28:GenotypeRed and Orange -0.257538552
## TreatmentNH4:DayF62:GenotypeRed and Orange 1.123316065
## TreatmentNH4+PO4:DayF62:GenotypeRed and Orange 0.505726348
## TreatmentNH4:DayF75:GenotypeRed and Orange 1.443446945
## TreatmentNH4+PO4:DayF75:GenotypeRed and Orange 1.419228642
## TreatmentNH4:DayF28:GenotypeRed and Yellow -0.104299097
## TreatmentNH4+PO4:DayF28:GenotypeRed and Yellow 0.166210222
## TreatmentNH4:DayF62:GenotypeRed and Yellow -0.344321855
## TreatmentNH4+PO4:DayF62:GenotypeRed and Yellow 1.129070479
## TreatmentNH4:DayF75:GenotypeRed and Yellow -0.000142085
## TreatmentNH4+PO4:DayF75:GenotypeRed and Yellow 1.014135983
## TreatmentNH4:DayF28:GenotypeYellow 1.645708746
## TreatmentNH4+PO4:DayF28:GenotypeYellow 1.353833902
## TreatmentNH4:DayF62:GenotypeYellow 0.984568766
## TreatmentNH4+PO4:DayF62:GenotypeYellow 1.826805034
## TreatmentNH4:DayF75:GenotypeYellow 1.480460849
## TreatmentNH4+PO4:DayF75:GenotypeYellow 1.607341561
## attr(,"label")
## [1] "Coefficients:"
##
## Correlation structure:
## lower est. upper
## cor(1,2) 0.3870296 0.5422908 0.6676486
## cor(1,3) -0.0015623 0.1939024 0.3750956
## cor(1,4) 0.1613445 0.3473443 0.5095147
## cor(2,3) 0.4572282 0.6063665 0.7223342
## cor(2,4) 0.4908815 0.6309231 0.7391827
## cor(3,4) 0.7140709 0.7978097 0.8590410
## attr(,"label")
## [1] "Correlation structure:"
##
## Variance function:
## lower est. upper
## 2 0.6761420 0.7982069 0.9423084
## 3 0.6250122 0.7564044 0.9154184
## 4 0.6462975 0.7762808 0.9324063
## attr(,"label")
## [1] "Variance function:"
##
## Residual standard error:
## lower est. upper
## 0.7316549 0.8395444 0.9633434
anova(fit3, type="marginal")
getVarCov(fit3)
## Marginal variance covariance matrix
## [,1] [,2] [,3] [,4]
## [1,] 0.70483 0.30510 0.10338 0.19005
## [2,] 0.30510 0.44907 0.25804 0.27555
## [3,] 0.10338 0.25804 0.40327 0.33019
## [4,] 0.19005 0.27555 0.33019 0.42474
## Standard Deviations: 0.83954 0.67013 0.63504 0.65172
#residuals(fit3, type="pearson")
par(mfrow=c(1,2))
plot(fitted(fit3), residuals(fit3, type="pearson"))
abline(h=0)
qqnorm(residuals(fit3, type="pearson"))
abline(0,1)
Predictions
clda_Gls_3 <- Gls(dAW.gd~ DayF* Treatment * MoteGen, data=BW.nutrients,
correlation=corSymm(form=~TimePoint|Fra),
weights=varIdent(form=~1|TimePoint),
na.action=na.exclude,
control=glsControl(opt="optim"))
data3<-expand.grid(DayF=unique(BW.nutrients$DayF),
Treatment=unique(BW.nutrients$Treatment),
MoteGen=unique(BW.nutrients$MoteGen))
predictions_3 <- cbind(data3,
predict (clda_Gls_3, data3, conf.int=0.95))
predictions_3$Days<-as.numeric(as.character(predictions_3$Day))
Model prediction Ambient (heat)
pd <- position_dodge(2)
limits <- aes(ymax = upper , ymin=lower, shape=Treatment)
Model_Tratement <- ggplot(predictions_3, aes(y=linear.predictors, x=Days,
fill=Treatment)) +
geom_errorbar(limits, width= 2 , position=pd) +
geom_line(aes(group=Treatment, y=linear.predictors), position=pd, size=0.1) +
geom_point(aes(fill=Treatment), shape=21, position=pd, size=4, alpha=0.8) +
ggthe_bw+
geom_hline(yintercept = 0, linetype=3)+
scale_x_continuous(name="Days in the experiment",
breaks = seq(0, 115, by=15)) +
scale_y_continuous(name="Estimated growth (mg / g d) ",
breaks = seq(-1, 4, by=1)) +
theme(text=element_text(size=14),
legend.position="right",
legend.title = element_blank(),
strip.background =element_rect(fill=NA)) +
annotate("segment", x = -30, xend = -2, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = -16, y = -1.2, label = "Baseline", size=3)+
annotate("segment", x = 2, xend = 91, y = -1.5, yend = -1.5,
colour = "gray90")+
annotate("text", x = 45, y = -1.2, label = "Nutrients", size=3)+
annotate("segment", x = 79, xend = 91, y = -1.4, yend = -1,
colour = "gray90")+
annotate("segment", x = 91, xend = 110, y = -1, yend = -1,
colour = "gray90")+
annotate("text", x = 99, y = -1.2, label = "Heat", size=3)
Model_Tratement + facet_wrap(~MoteGen)