PARCELAS DIVIDIDAS * FACTORIAL SIMPLE COMPLETAMENTE AL AZAR * FACTORIAL COMPLETO EN ARREGLO COMPLETAMENTE AL AZAR * FACTORIAL COMPLETO EN BLOQUES COMPLETAMENTE AL AZAR * FACTORIAL COMPLETO EN PARCELAS DIVIDIDAS * FACTORIAL INCOMPLETO COMPLETAMENTE AL AZAR
NOTA: TRABAJO
TRABAJO FINAL (quiz)
##PARCELAS DIVIDIDAS##
Requiere por lo menos 2 factores:
“Dos veces el experimento” (2 aleatorizaciones)
Sirve para riego, fertilidad, densidad de siembra, maquinaria
Podria necesitar bloqueo
FACTOR 1: variedad (V1, v2, v3, v4) FACTOR 2: riego (r1, r2, r3)
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
xy= expand.grid(x=seq(6), y = seq(4))
xy = sample_frac(xy)
xy$f1 = gl (4, 6, 24, paste0 ("V", 1:4))
xy$f2 = gl (3 , 2, 24, paste0 ("R", 1:3))
xy$rep = gl (2 , 1, 24, paste0 ("r", 1:2))
xy$name = paste0 (xy$f1 , xy$f2 , xy$rep)
xy
## x y f1 f2 rep name
## 1 4 1 V1 R1 r1 V1R1r1
## 2 6 4 V1 R1 r2 V1R1r2
## 3 1 4 V1 R2 r1 V1R2r1
## 4 6 1 V1 R2 r2 V1R2r2
## 5 1 2 V1 R3 r1 V1R3r1
## 6 3 4 V1 R3 r2 V1R3r2
## 7 6 2 V2 R1 r1 V2R1r1
## 8 2 2 V2 R1 r2 V2R1r2
## 9 3 2 V2 R2 r1 V2R2r1
## 10 5 2 V2 R2 r2 V2R2r2
## 11 4 3 V2 R3 r1 V2R3r1
## 12 2 1 V2 R3 r2 V2R3r2
## 13 5 3 V3 R1 r1 V3R1r1
## 14 3 1 V3 R1 r2 V3R1r2
## 15 4 2 V3 R2 r1 V3R2r1
## 16 1 3 V3 R2 r2 V3R2r2
## 17 2 3 V3 R3 r1 V3R3r1
## 18 5 4 V3 R3 r2 V3R3r2
## 19 6 3 V4 R1 r1 V4R1r1
## 20 2 4 V4 R1 r2 V4R1r2
## 21 4 4 V4 R2 r1 V4R2r1
## 22 5 1 V4 R2 r2 V4R2r2
## 23 1 1 V4 R3 r1 V4R3r1
## 24 3 3 V4 R3 r2 V4R3r2
library(ggplot2)
ggplot(xy)+
aes(x,y, label = name, fill = f2)+
geom_tile(colourl ='white')+
geom_label(fill = 'white')+
labs(title = 'completamente al azar')
## Warning in geom_tile(colourl = "white"): Ignoring unknown parameters: `colourl`
library(dplyr)
xy = expand.grid(y = seq(4), x = seq(6))
f2 = gl(3, 8, 24, paste0('R',1:3))
lf1 = paste0('V',1:4)
f1 = c(sample(lf1),sample(lf1),
sample(lf1),sample(lf1),
sample(lf1),sample(lf1))
rep = rep(rep(paste0('r',1:2), each=4), 3)
data = data.frame(xy, f1, f2, rep)
data$name = with(data, paste0(f1, rep))
library(ggplot2)
ggplot(data)+
aes(x,y,label=name, fill=f1)+
geom_tile(color='white')+
geom_text()+
facet_wrap(~f2, scales = 'free')+
theme(axis.text = element_blank())
set.seed(123)
data$biom = rnorm(24, 8, 2)
### Analisis descriptivo
ggplot(data)+
aes(f2, biom)+
geom_boxplot()
ggplot(data)+
aes(f1, biom)+
geom_boxplot()
ggplot(data)+
aes(f2, biom, fill=f1)+
geom_boxplot()
mod1 = aov(biom ~ f2 * f1 + Error(f2:rep), data)
## Warning in aov(biom ~ f2 * f1 + Error(f2:rep), data): Error() model is singular
summary(mod1)
##
## Error: f2:rep
## Df Sum Sq Mean Sq F value Pr(>F)
## f2 2 13.327 6.664 8.078 0.062 .
## Residuals 3 2.475 0.825
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Error: Within
## Df Sum Sq Mean Sq F value Pr(>F)
## f1 3 8.83 2.942 0.706 0.572
## f2:f1 6 22.48 3.746 0.899 0.534
## Residuals 9 37.48 4.165
Riego no tuvo diferencia en la biomasa porque el p- valor es mayor al 5%