Experimento de Moniliophthora Pernisiosa

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(PerformanceAnalytics)
## Loading required package: xts
## Loading required package: zoo
## 
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
## 
##     as.Date, as.Date.numeric
## 
## Attaching package: 'xts'
## The following objects are masked from 'package:dplyr':
## 
##     first, last
## 
## Attaching package: 'PerformanceAnalytics'
## The following object is masked from 'package:graphics':
## 
##     legend
library(plotly)
## Loading required package: ggplot2
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.0 --
## v tibble  3.0.4     v purrr   0.3.4
## v tidyr   1.1.2     v stringr 1.4.0
## v readr   1.4.0     v forcats 0.5.0
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x plotly::filter() masks dplyr::filter(), stats::filter()
## x xts::first()     masks dplyr::first()
## x dplyr::lag()     masks stats::lag()
## x xts::last()      masks dplyr::last()
library(reshape2)
## 
## Attaching package: 'reshape2'
## The following object is masked from 'package:tidyr':
## 
##     smiths
library(ggrepel)
library(rgl)
library(car)
## Loading required package: carData
## 
## Attaching package: 'car'
## The following object is masked from 'package:purrr':
## 
##     some
## The following object is masked from 'package:dplyr':
## 
##     recode
library(sf)
## Linking to GEOS 3.8.0, GDAL 3.0.4, PROJ 6.3.1
library(tmap)
library(rgdal)
## Loading required package: sp
## rgdal: version: 1.5-18, (SVN revision 1082)
## Geospatial Data Abstraction Library extensions to R successfully loaded
## Loaded GDAL runtime: GDAL 3.0.4, released 2020/01/28
## Path to GDAL shared files: C:/Users/User/Documents/R/win-library/4.0/rgdal/gdal
## GDAL binary built with GEOS: TRUE 
## Loaded PROJ runtime: Rel. 6.3.1, February 10th, 2020, [PJ_VERSION: 631]
## Path to PROJ shared files: C:/Users/User/Documents/R/win-library/4.0/rgdal/proj
## Linking to sp version:1.4-4
## To mute warnings of possible GDAL/OSR exportToProj4() degradation,
## use options("rgdal_show_exportToProj4_warnings"="none") before loading rgdal.
library(esquisse)
library(ggplot2)
library(gridExtra)
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
library(readxl)
library(agricolae)
## 
## Attaching package: 'agricolae'
## The following objects are masked from 'package:PerformanceAnalytics':
## 
##     kurtosis, skewness
exp <- read_excel("C:/Users/User/Desktop/exp.xlsx", 
                  sheet = "MP")
#View(exp)
attach(exp)
names(exp)
##  [1] "Número"   "Genot"    "Bloco"    "Inoculo"  "dia2610"  "dia3110" 
##  [7] "dia30510" "dia1011"  "dia1511"  "dia2011"  "dia2511"  "alt1011" 
## [13] "alt2011"
a <- as.factor(Genot)
b <- as.factor(Inoculo)
inter<-as.factor(a:b)

############ 1.1 anova diametro de folia dia 26 de outubro ###########################
summary(aov(dia2610 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)
## a             4  0.431  0.1078   0.917  0.456
## b             1  0.000  0.0003   0.003  0.960
## inter         4  0.538  0.1345   1.143  0.339
## Residuals   139 16.346  0.1176               
## 2 observations deleted due to missingness
LSD.test(aov(dia2610 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia2610 groups
## VG    1.404828      a
## VAZIO 1.326333      a
## VF    1.313000      a
## MT    1.296000      a
## VF.1  1.237000      a
LSD.test(aov(dia2610 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia2610 groups
## FUNGO     1.316912      a
## SEM FUNGO 1.313086      a
LSD.test(aov(dia2610 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia2610 groups
## VG:FUNGO        1.405714      a
## VG:SEM FUNGO    1.404000      a
## MT:SEM FUNGO    1.391765      a
## VF:FUNGO        1.382000      a
## VAZIO:FUNGO     1.345000      a
## VAZIO:SEM FUNGO 1.313889      a
## VF.1:FUNGO      1.270000      a
## VF:SEM FUNGO    1.244000      a
## VF.1:SEM FUNGO  1.208125      a
## MT:FUNGO        1.170769      a
shapiro.test(unlist(aov(dia2610 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia2610 ~ a + b + inter, data = exp)["residuals"])
## W = 0.9623, p-value = 0.0004221
res <-sort(unlist(aov( dia2610 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.08847, p-value = 0.1939
## alternative hypothesis: two-sided
kruskal(dia2610, inter)["groups"]
## $groups
##                  dia2610 groups
## VF:FUNGO        90.23333      a
## MT:SEM FUNGO    89.85294      a
## VG:SEM FUNGO    87.60000     ab
## VG:FUNGO        87.17857     ab
## VAZIO:SEM FUNGO 79.72222     ab
## VAZIO:FUNGO     78.29167     ab
## VF:SEM FUNGO    67.86667     ab
## VF.1:FUNGO      66.25000     ab
## VF.1:SEM FUNGO  57.18750      b
## MT:FUNGO        55.34615      b
## NA              53.00000      b
############ 1.1 anova diametro de folia dia 31 de outubro ########################
summary(aov(dia3110 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value  Pr(>F)   
## a             4  2.546  0.6364   4.525 0.00182 **
## b             1  0.473  0.4731   3.364 0.06878 . 
## inter         4  0.630  0.1574   1.119 0.34995   
## Residuals   139 19.549  0.1406                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 2 observations deleted due to missingness
LSD.test(aov(dia3110 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia3110 groups
## VF    1.805667      a
## VAZIO 1.760333     ab
## VG    1.567931     bc
## VF.1  1.505000      c
## MT    1.497000      c
LSD.test(aov(dia3110 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia3110 groups
## SEM FUNGO 1.678889      a
## FUNGO     1.566471      a
LSD.test(aov(dia3110 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia3110 groups
## VF:FUNGO        1.832667      a
## VAZIO:SEM FUNGO 1.803333      a
## VF:SEM FUNGO    1.778667      a
## VAZIO:FUNGO     1.695833      a
## MT:SEM FUNGO    1.630588     ab
## VF.1:SEM FUNGO  1.598125    abc
## VG:SEM FUNGO    1.570667    abc
## VG:FUNGO        1.565000    abc
## VF.1:FUNGO      1.398571     bc
## MT:FUNGO        1.322308      c
shapiro.test(unlist(aov(dia3110 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia3110 ~ a + b + inter, data = exp)["residuals"])
## W = 0.9341, p-value = 2.078e-06
res <-sort(unlist(aov( dia3110 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.082036, p-value = 0.2685
## alternative hypothesis: two-sided
kruskal(dia3110, inter)["groups"]
## $groups
##                   dia3110 groups
## VF:FUNGO        100.66667      a
## VAZIO:SEM FUNGO 100.02778      a
## VF:SEM FUNGO     91.86667     ab
## VAZIO:FUNGO      85.70833     ab
## MT:SEM FUNGO     76.35294     ab
## VF.1:SEM FUNGO   70.50000     bc
## NA               70.00000     bc
## VG:FUNGO         68.14286     bc
## VG:SEM FUNGO     66.56667     bc
## MT:FUNGO         43.92308      c
## VF.1:FUNGO       42.03571      c
############ 1.1 anova diametro de folia dia 05 de novembro ########################
summary(aov(dia30510 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)  
## a             4   3.58  0.8959   2.593 0.0392 *
## b             1   0.12  0.1181   0.342 0.5598  
## inter         4   0.24  0.0593   0.171 0.9527  
## Residuals   139  48.03  0.3455                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 2 observations deleted due to missingness
LSD.test(aov(dia30510 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##       dia30510 groups
## VF    2.222667      a
## VG    2.132759      a
## VAZIO 2.058000     ab
## MT    1.935333     ab
## VF.1  1.780000      b
LSD.test(aov(dia30510 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##           dia30510 groups
## SEM FUNGO 2.047407      a
## FUNGO     1.998382      a
LSD.test(aov(dia30510 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                 dia30510 groups
## VF:FUNGO        2.262667      a
## VF:SEM FUNGO    2.182667     ab
## VG:SEM FUNGO    2.146000    abc
## VAZIO:SEM FUNGO 2.119444    abc
## VG:FUNGO        2.118571    abc
## MT:SEM FUNGO    1.982353    abc
## VAZIO:FUNGO     1.965833    abc
## MT:FUNGO        1.873846    abc
## VF.1:SEM FUNGO  1.816250     bc
## VF.1:FUNGO      1.738571      c
shapiro.test(unlist(aov(dia30510 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia30510 ~ a + b + inter, data = exp)["residuals"])
## W = 0.94528, p-value = 1.444e-05
res <-sort(unlist(aov( dia30510 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.057363, p-value = 0.7109
## alternative hypothesis: two-sided
kruskal(dia30510, inter)["groups"]
## $groups
##                 dia30510 groups
## VF:FUNGO        93.16667      a
## VF:SEM FUNGO    92.30000      a
## VG:SEM FUNGO    89.96667      a
## VAZIO:SEM FUNGO 87.19444     ab
## VG:FUNGO        74.82143    abc
## MT:SEM FUNGO    72.70588    abc
## VAZIO:FUNGO     71.75000    abc
## MT:FUNGO        63.92308    abc
## VF.1:SEM FUNGO  58.09375     bc
## VF.1:FUNGO      56.21429      c
## NA              41.50000      c
############ 1.1 anova diametro de folia dia 10 de novembro ########################
summary(aov(dia1011 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)
## a             4   2.34  0.5859   0.857  0.492
## b             1   0.02  0.0170   0.025  0.875
## inter         4   2.10  0.5254   0.768  0.548
## Residuals   139  95.07  0.6840               
## 2 observations deleted due to missingness
LSD.test(aov(dia1011 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia1011 groups
## VF    3.238333      a
## VAZIO 3.115333      a
## MT    3.093333      a
## VG    3.067241      a
## VF.1  2.852667      a
LSD.test(aov(dia1011 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia1011 groups
## SEM FUNGO 3.082469      a
## FUNGO     3.062647      a
LSD.test(aov(dia1011 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia1011 groups
## VF:SEM FUNGO    3.372000      a
## VAZIO:FUNGO     3.362500      a
## VG:SEM FUNGO    3.160667      a
## MT:SEM FUNGO    3.135882      a
## VF:FUNGO        3.104667      a
## MT:FUNGO        3.037692      a
## VG:FUNGO        2.967143      a
## VAZIO:SEM FUNGO 2.950556      a
## VF.1:FUNGO      2.879286      a
## VF.1:SEM FUNGO  2.829375      a
shapiro.test(unlist(aov(dia1011 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia1011 ~ a + b + inter, data = exp)["residuals"])
## W = 0.87074, p-value = 4.387e-10
res <-sort(unlist(aov( dia1011 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.14904, p-value = 0.002668
## alternative hypothesis: two-sided
kruskal(dia1011, inter)["groups"]
## $groups
##                   dia1011 groups
## VF:SEM FUNGO    103.63333      a
## VAZIO:FUNGO      92.04167     ab
## VG:SEM FUNGO     87.80000     ab
## MT:SEM FUNGO     85.64706    abc
## VAZIO:SEM FUNGO  78.27778   abcd
## VF:FUNGO         75.50000   abcd
## MT:FUNGO         65.65385    bcd
## NA               64.00000    bcd
## VG:FUNGO         62.50000    bcd
## VF.1:SEM FUNGO   57.28125     cd
## VF.1:FUNGO       52.10714      d
############ 1.1 anova diametro de folia dia 15 de novembro ########################
summary(aov(dia1511 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)
## a             4   2.63  0.6575   0.879  0.478
## b             1   0.31  0.3094   0.414  0.521
## inter         4   2.77  0.6922   0.926  0.451
## Residuals   139 103.95  0.7479               
## 2 observations deleted due to missingness
LSD.test(aov(dia1511 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia1511 groups
## MT    3.880000      a
## VF    3.839667      a
## VAZIO 3.715667      a
## VG    3.565862      a
## VF.1  3.562000      a
LSD.test(aov(dia1511 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia1511 groups
## SEM FUNGO 3.756667      a
## FUNGO     3.662353      a
LSD.test(aov(dia1511 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia1511 groups
## VF:SEM FUNGO    3.992667      a
## VAZIO:FUNGO     3.965000      a
## MT:FUNGO        3.880769      a
## MT:SEM FUNGO    3.879412      a
## VG:SEM FUNGO    3.703333      a
## VF.1:SEM FUNGO  3.688125      a
## VF:FUNGO        3.686667      a
## VAZIO:SEM FUNGO 3.549444      a
## VG:FUNGO        3.418571      a
## VF.1:FUNGO      3.417857      a
shapiro.test(unlist(aov(dia1511 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia1511 ~ a + b + inter, data = exp)["residuals"])
## W = 0.88592, p-value = 2.502e-09
res <-sort(unlist(aov( dia1511 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.111, p-value = 0.05087
## alternative hypothesis: two-sided
kruskal(dia1511, inter)["groups"]
## $groups
##                  dia1511 groups
## VF:SEM FUNGO    98.20000      a
## MT:SEM FUNGO    91.11765     ab
## VAZIO:FUNGO     90.79167    abc
## VAZIO:SEM FUNGO 79.44444   abcd
## VF.1:SEM FUNGO  78.18750   abcd
## VF:FUNGO        75.63333   abcd
## MT:FUNGO        73.50000   abcd
## VG:SEM FUNGO    65.43333    bcd
## VF.1:FUNGO      58.60714     cd
## NA              49.75000     cd
## VG:FUNGO        49.42857      d
############ 1.1 anova diametro de folia dia 20 de novembro ########################
summary(aov(dia2011 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)  
## a             4   19.0   4.740   0.719 0.5800  
## b             1    4.7   4.694   0.712 0.4001  
## inter         4   58.5  14.615   2.218 0.0701 .
## Residuals   139  915.8   6.589                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 2 observations deleted due to missingness
LSD.test(aov(dia2011 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia2011 groups
## VAZIO 5.076000      a
## MT    4.549000      a
## VF.1  4.196667      a
## VF    4.174667      a
## VG    4.140690      a
LSD.test(aov(dia2011 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia2011 groups
## FUNGO     4.596029      a
## SEM FUNGO 4.289383      a
LSD.test(aov(dia2011 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia2011 groups
## VAZIO:FUNGO     6.808333      a
## MT:FUNGO        4.577692      b
## MT:SEM FUNGO    4.527059      b
## VF.1:SEM FUNGO  4.430000      b
## VF:SEM FUNGO    4.325333      b
## VG:SEM FUNGO    4.276000      b
## VF:FUNGO        4.024000      b
## VG:FUNGO        3.995714      b
## VF.1:FUNGO      3.930000      b
## VAZIO:SEM FUNGO 3.921111      b
shapiro.test(unlist(aov(dia2011 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia2011 ~ a + b + inter, data = exp)["residuals"])
## W = 0.42982, p-value < 2.2e-16
res <-sort(unlist(aov( dia2011 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.27016, p-value = 7.168e-10
## alternative hypothesis: two-sided
kruskal(dia2011, inter)["groups"]
## $groups
##                  dia2011 groups
## MT:SEM FUNGO    96.26471      a
## VAZIO:FUNGO     95.58333     ab
## VF:SEM FUNGO    85.93333    abc
## VF.1:SEM FUNGO  81.65625   abcd
## MT:FUNGO        81.50000   abcd
## VAZIO:SEM FUNGO 75.02778   abcd
## VG:SEM FUNGO    69.26667   abcd
## VF:FUNGO        63.90000    bcd
## VF.1:FUNGO      59.07143     cd
## NA              55.50000     cd
## VG:FUNGO        53.67857      d
############ 1.1 anova diametro de folia dia 25 de novembro ########################
summary(aov(dia2511 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)
## a             4   1.26  0.3155   0.146  0.964
## b             1   0.37  0.3709   0.172  0.679
## inter         4   7.75  1.9377   0.900  0.466
## Residuals   138 297.23  2.1538               
## 3 observations deleted due to missingness
LSD.test(aov(dia2511 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        dia2511 groups
## VF    4.739000      a
## VF.1  4.569333      a
## VAZIO 4.552000      a
## MT    4.514333      a
## VG    4.466071      a
LSD.test(aov(dia2511 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            dia2511 groups
## SEM FUNGO 4.613500      a
## FUNGO     4.517794      a
LSD.test(aov(dia2511 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  dia2511 groups
## MT:SEM FUNGO    4.905882      a
## VF:SEM FUNGO    4.783333      a
## VG:FUNGO        4.725000      a
## VF:FUNGO        4.694667      a
## VF.1:FUNGO      4.626429      a
## VAZIO:SEM FUNGO 4.595556      a
## VF.1:SEM FUNGO  4.519375      a
## VAZIO:FUNGO     4.486667      a
## VG:SEM FUNGO    4.207143      a
## MT:FUNGO        4.002308      a
shapiro.test(unlist(aov(dia2511 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(dia2511 ~ a + b + inter, data = exp)["residuals"])
## W = 0.73455, p-value = 4.773e-15
res <-sort(unlist(aov( dia2511 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.20163, p-value = 1.188e-05
## alternative hypothesis: two-sided
kruskal(dia2511, inter)["groups"]
## $groups
##                   dia2511 groups
## NA              131.50000      a
## MT:SEM FUNGO     89.44118     ab
## VF:FUNGO         85.53333     ab
## VF.1:FUNGO       80.32143     ab
## VF.1:SEM FUNGO   77.18750     ab
## VAZIO:SEM FUNGO  75.13889     ab
## VG:FUNGO         73.35714     ab
## VAZIO:FUNGO      72.20833     ab
## VF:SEM FUNGO     65.66667      b
## MT:FUNGO         62.50000      b
## VG:SEM FUNGO     61.10714      b
############ 1.1 anova altura da planta dia 10 de novembro ########################
summary(aov(alt1011 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value  Pr(>F)   
## a             4   43.8  10.941   4.706 0.00137 **
## b             1   13.0  12.983   5.585 0.01951 * 
## inter         4   14.4   3.591   1.545 0.19264   
## Residuals   138  320.8   2.325                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 3 observations deleted due to missingness
LSD.test(aov(alt1011 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        alt1011 groups
## VF    8.017241      a
## VG    7.375862     ab
## VAZIO 7.210000     bc
## VF.1  6.665667     bc
## MT    6.483333      c
LSD.test(aov(alt1011 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            alt1011 groups
## SEM FUNGO 7.391250      a
## FUNGO     6.851029      b
LSD.test(aov(alt1011 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                  alt1011 groups
## VF:SEM FUNGO    8.442857      a
## VG:SEM FUNGO    7.740000     ab
## VF:FUNGO        7.620000     ab
## VAZIO:FUNGO     7.583333     ab
## VF.1:SEM FUNGO  7.031250     bc
## MT:SEM FUNGO    7.011765     bc
## VG:FUNGO        6.985714     bc
## VAZIO:SEM FUNGO 6.961111     bc
## VF.1:FUNGO      6.247857     cd
## MT:FUNGO        5.792308      d
shapiro.test(unlist(aov(alt1011 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(alt1011 ~ a + b + inter, data = exp)["residuals"])
## W = 0.93617, p-value = 3.145e-06
res <-sort(unlist(aov( alt1011 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.10512, p-value = 0.07593
## alternative hypothesis: two-sided
kruskal(alt1011, inter)["groups"]
## $groups
##                   alt1011 groups
## VF:SEM FUNGO    109.46429      a
## VG:SEM FUNGO     90.06667     ab
## VAZIO:FUNGO      88.87500     ab
## VF:FUNGO         88.03333     ab
## NA               83.00000    abc
## VAZIO:SEM FUNGO  77.55556     bc
## VF.1:SEM FUNGO   74.87500     bc
## MT:SEM FUNGO     69.35294     bc
## VG:FUNGO         64.92857     bc
## VF.1:FUNGO       47.89286      c
## MT:FUNGO         41.23077      c
############ 1.1 anova altura da planta dia 20 de novembro ########################
summary(aov(alt2011 ~ a+b+inter, data = exp))
##              Df Sum Sq Mean Sq F value Pr(>F)  
## a             4   62.5   15.62   3.101 0.0176 *
## b             1   32.3   32.32   6.417 0.0124 *
## inter         4   20.9    5.22   1.037 0.3904  
## Residuals   138  695.2    5.04                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 3 observations deleted due to missingness
LSD.test(aov(alt2011 ~ a + b + inter, data = exp),
         "a", alpha = 0.05)["groups"]
## $groups
##        alt2011 groups
## VF    12.30345      a
## VF.1  11.16000     ab
## VAZIO 10.88333      b
## MT    10.83333      b
## VG    10.33793      b
LSD.test(aov(alt2011 ~ a + b + inter, data = exp),
         "b", alpha = 0.05)["groups"]
## $groups
##            alt2011 groups
## SEM FUNGO 11.50375      a
## FUNGO     10.62647      b
LSD.test(aov(alt2011 ~ a + b + inter, data = exp),
         "inter", alpha = 0.05)["groups"]
## $groups
##                   alt2011 groups
## VF:SEM FUNGO    13.000000      a
## VF:FUNGO        11.653333     ab
## MT:SEM FUNGO    11.617647     ab
## VF.1:SEM FUNGO  11.406250    abc
## VAZIO:FUNGO     11.083333    bcd
## VG:SEM FUNGO    10.986667    bcd
## VF.1:FUNGO      10.878571    bcd
## VAZIO:SEM FUNGO 10.750000    bcd
## MT:FUNGO         9.807692     cd
## VG:FUNGO         9.642857      d
shapiro.test(unlist(aov(alt2011 ~ a + b + inter, 
                        data = exp)["residuals"]))
## 
##  Shapiro-Wilk normality test
## 
## data:  unlist(aov(alt2011 ~ a + b + inter, data = exp)["residuals"])
## W = 0.9019, p-value = 2.009e-08
res <-sort(unlist(aov( alt2011 ~ a + b + inter, 
                       data = exp)["residuals"]),decreasing = TRUE)
ks.test(res,  "pnorm" ,mean(res),sd(res))
## Warning in ks.test(res, "pnorm", mean(res), sd(res)): ties should not be present
## for the Kolmogorov-Smirnov test
## 
##  One-sample Kolmogorov-Smirnov test
## 
## data:  res
## D = 0.10956, p-value = 0.05728
## alternative hypothesis: two-sided
kruskal(alt2011, inter)["groups"]
## $groups
##                   alt2011 groups
## VF:SEM FUNGO    113.78571      a
## NA              110.50000     ab
## MT:SEM FUNGO     85.47059     ab
## VF:FUNGO         82.20000      b
## VF.1:SEM FUNGO   80.90625      b
## VAZIO:SEM FUNGO  78.55556      b
## VAZIO:FUNGO      70.83333      b
## VG:SEM FUNGO     69.06667      b
## VF.1:FUNGO       65.39286     bc
## MT:FUNGO         58.69231     bc
## VG:FUNGO         39.42857      c