library(readxl)
## Warning: package 'readxl' was built under R version 4.0.3
X19_10_20_Black_soldier_fly <- read_excel("C:/Users/Admin/Desktop/LR of BSL/19.10.20 Black soldier fly.xlsx", sheet = "Tukey", col_types = c("text", 
"numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric", "numeric"))
## Warning in strptime(x, format, tz = tz): unable to identify current timezone 'C':
## please set environment variable 'TZ'
attach(X19_10_20_Black_soldier_fly)
require(ggplot2)
## Loading required package: ggplot2
## Warning: package 'ggplot2' was built under R version 4.0.3

Final Weight (g)

Tukey

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y=`Final weight (g)`))
h+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","ab","ab","b","c"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Duncan

h+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","a","ab","b","c"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Weight gain (g)

Tukey

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h2=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y= `Weight gain (g)`))
h2+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","ab","ab","b","c"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Duncan

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h2=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y= `Weight gain (g)`))
h2+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","a","ab","b","c"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Feed intake

Tukey

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h3=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y= `Feed intake (%/fish/day)`))
h3+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","a","b","b","b"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Duncan

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h3=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y= `Feed intake (%/fish/day)`))
h3+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","b","bc","bc","c"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

FCR

Tukey

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h4=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y='FCR'))
h4+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","ab","ab","ab","ab"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.

Duncan

level_order=c("0%BSF","5%BSF","10%BSF","15%BSF","20%BSF")
h4=ggplot(X19_10_20_Black_soldier_fly,aes(x=factor(Treatment,level_order),y='FCR'))
h4+stat_summary(fun="mean",geom="bar",fill=("blue"),width=0.5)+stat_summary(geom = "errorbar", fun.data=mean_se,position="dodge",width=0.2)+theme_bw()+theme_classic()+stat_summary(geom= 'text', fun.y = max,position=position_dodge(.7), label = c("a","a","a","a","a"), vjust =-0.3)+xlab("Treatment")
## Warning: `fun.y` is deprecated. Use `fun` instead.