setwd("~/pye1pm")
library(pacman)
p_load("base64enc", "htmltools", "mime", "xfun", "prettydoc","readr", "knitr","DT","dplyr", "ggplot2")

Acontinuacion el histograma en este caso para fert

plantas <- read_csv("plantas.csv")
## Rows: 42 Columns: 3
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr (1): Tratamiento
## dbl (2): planta, IE
## 
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.
Fert <- subset(plantas, Tratamiento == "Fert")
hist(Fert$IE, col = "red")

summary(Fert$IE)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##  0.5600  0.7800  0.9100  0.9067  1.0400  1.1600

Desviacion estandar.

sd(Fert$IE)
## [1] 0.1799537

Prueba de normalidad de Shapiro-Wilk

shapiro.test(Fert\(IE) # # Shapiro-Wilk normality test # # data: Fert\)IE # W = 0.95339, p-value = 0.3941 Dado que P>0.05,

los datos anteriores pasan la prueba de normalidad

Prueba de normalidad

ks.test(Fert\(IE, "pnorm", mean=mean(Fert\)IE), sd=sd(Fert\(IE) ) Warning in ks.test(Fert\)IE, “pnorm”, mean = mean(Fert\(IE), sd = sd(Fert\)IE)): ties should not be present for the Kolmogorov-Smirnov test One-sample Kolmogorov-Smirnov test

data: Fert$IE D = 0.10776, p-value = 0.9677 alternative hypothesis: two-sided Dado que P>0.05,

Los datos anteriores pasan la prueba de normalidad