Benjamin correction after ANOVA

Can anyone help me how to include Benjamin correction after ANOVA

for(i in 1:0){
print(i)
EW1=t(DEV$EW1[i])
EW2=t(DEV$EW2[i])
EW3=t(DEV$EW3[i])
MW1=t(DEV$MW1[i])
MW2=t(DEV$MW2[i])
MW3=t(DEV$MW3[i])
LW1=t(DEV$LW1[i])
LW2=t(DEV$LW2[i])
LW3=t(DEV$LW3[i])
EWGROUP <- c(EW1,EW2,EW3)
MWGROUP <- c(MW1,MW2,MW3)
LWGROUP <- c(LW1,LW2,LW3)
Combined_Groups <- data.frame(cbind(
EWGROUP, MWGROUP, LWGROUP))
Stacked_Groups <- stack(Combined_Groups)
Anova_Results <- aov(values ~ ind, data = Stacked_Groups)
summary <-summary(Anova_Results)

#summary <-summary(Anova_Results, p.adj= "bonferrono")

posthoc <- TukeyHSD(x=Anova_Results, conf.level=0.95)
p_adj_data <- data.frame(posthoc[1]$ind)["p.adj"]
write.table(rbind(p_adj_data$p.adj), paste('test/',i,"-test.csv"), row.names=FALSE, col.names=FALSE, sep=",")
print(p_adj_data$p.adj)
}

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.