What level of tensile strength can Honey provide in the cornstarch-based bioplastic in terms of: 1.1 polymer with 4 mL of Honey as plasticizer, 1.2 polymer with 5 mL of Honey as plasticizer, 1.3 polymer with 6 mL of Honey as plasticizer and 1.4 typical polymer with 5 mL Glycerol as plasticizer?
summary <- data1 %>%
group_by(Bioplastic) %>%
dplyr::summarize(N = length(Tensile.Strength.Mpa.),
Mean.MPA = round(mean(Tensile.Strength.Mpa.),2),
SD.MPA = round(sd(Tensile.Strength.Mpa.),2))
DT::datatable(summary,
extensions = c('FixedColumns',"FixedHeader"),
options = list(scrollX = FALSE,
paging=FALSE,
fixedHeader=FALSE),)
Is there a significant difference between the tensile strength of the different concentrations or amounts of Honey added on the cornstarch-based bioplastic in terms of: 1.1 polymer with 4 mL of Honey as plasticizer, 1.2 polymer with 5 mL of Honey as plasticizer and 1.3 polymer with 6 mL of Honey as plasticizer?
Is there a significant difference between the tensile strength of the cornstarch-based bioplastic with Honey and Glycerol as the plasticizer?
data1 <- data.frame(data1, Rank = rank(data1$Tensile.Strength.Mpa.))
summary2 <- data1 %>%
group_by(Bioplastic) %>%
dplyr::summarize(N = length(Tensile.Strength.Mpa.),
Mean.Rank = round(mean(Rank),2),
SD.Rank = round(sd(Rank),2)
)
DT::datatable(summary2,
extensions = c('FixedColumns',"FixedHeader"),
options = list(scrollX = FALSE,
paging=FALSE,
fixedHeader=FALSE),)
kruskal.test(Tensile.Strength.Mpa.~Bioplastic, data1)
##
## Kruskal-Wallis rank sum test
##
## data: Tensile.Strength.Mpa. by Bioplastic
## Kruskal-Wallis chi-squared = 9.7006, df = 3, p-value = 0.02129
datatable(dunn_test(data1, Tensile.Strength.Mpa.~Bioplastic),
extensions = c('FixedColumns',"FixedHeader"),
options = list(scrollX = FALSE,
paging=FALSE,
fixedHeader=FALSE),) %>%
formatRound('statistic', 3) %>%
formatRound('p', 3) %>%
formatRound('p.adj', 3)