library(readxl)
## Warning: package 'readxl' was built under R version 4.3.1
data1 <- read_excel("H:/Unidades compartidas/Ensayo yuca inoculacion/Datos_yuca_Lavega.xlsx", 
    sheet = "fenotipage 2")
str(data1)
## tibble [440 × 9] (S3: tbl_df/tbl/data.frame)
##  $ F    : POSIXct[1:440], format: "2024-02-28" "2024-02-28" ...
##  $ M    : num [1:440] 1 1 1 1 1 1 1 1 1 1 ...
##  $ F1   : chr [1:440] "V28" "V28" "V28" "V28" ...
##  $ F2   : chr [1:440] "con" "con" "con" "con" ...
##  $ INT  : chr [1:440] "V28-con" "V28-con" "V28-con" "V28-con" ...
##  $ PL   : num [1:440] 1 2 3 4 5 6 7 8 9 10 ...
##  $ UDPC : num [1:440] 0 0 0 0 0 NA 0 0 0 0 ...
##  $ DIATA: num [1:440] 3.5 3.34 3.3 2.56 3.11 2.74 3.16 3.15 3.03 3.28 ...
##  $ ALTPL: num [1:440] 35 42.5 49.9 32.5 37 40.4 41 36.8 32.5 41.5 ...

Diametro de tallo

library(lattice)
# Interaccion variedad por tiempo
bwplot(DIATA ~ F1 | as.factor(M), data=data1)

# Interaccion inoculo por tiempo
bwplot(DIATA ~ F2 | as.factor(M), data=data1)

# Interaccion variedad por inoculo por tiempo
xyplot(DIATA ~ as.factor(M) | F1 , 
       data=data1, group = F2,
       type = c("p", "g", "smooth"),
       xlab = "Muestreo", ylab = "Diametro de tallo (cm)")

# Altura de planta

library(lattice)
# Interaccion variedad por tiempo
bwplot(ALTPL ~ F1 | as.factor(M), data=data1)

# Interaccion inoculo por tiempo
bwplot(ALTPL ~ F2 | as.factor(M), data=data1)

# Interaccion variedad por inoculo por tiempo
xyplot(ALTPL ~ as.factor(M) | F1 , 
       data=data1, group = F2,
       type = c("p", "g", "smooth"),
       xlab = "Muestreo", ylab = "Altura de planta (cm)")