library(readxl)
## Warning: package 'readxl' was built under R version 4.0.3
Diet <- read_excel("C:/Users/Admin/Desktop/Thesis Proposal/Diet.xlsx",sheet = "Growth", col_types = c("text", "text", "numeric", "numeric", "numeric", "numeric", "numeric"))
attach(Diet)
require(ggplot2)
## Loading required package: ggplot2
## Warning: package 'ggplot2' was built under R version 4.0.3
David=element_text(face = "bold", color = "black", size = 9)
Feed intake
g=ggplot(Diet,aes(x=`Feeding level`,y=`Feed intake(g.day)`,fill=Treatment))
g+geom_bar(stat = "identity",position=position_dodge(width=0.9))+theme_bw()+theme_classic()+theme(axis.text.x=David)+theme(axis.text.y=David)

DWG
g1=ggplot(Diet,aes(x=`Feeding level`,y=`DWG(g/kg-0.8/day)`,fill=Treatment))
g1+geom_bar(stat = "identity",position=position_dodge(width=0.9))+theme_bw()+theme_classic()+theme(axis.text.x=David)+theme(axis.text.y=David)

FCR
g2=ggplot(Diet,aes(x=`Feeding level`,y=FCR,fill=Treatment))
g2+geom_bar(stat = "identity",position=position_dodge(width=0.9))+theme_bw()+theme_classic()+theme(axis.text.x=David)+theme(axis.text.y=David)

SR
g3=ggplot(Diet,aes(x=`Feeding level`,y=`SR(%)`,fill=Treatment))
g3+geom_bar(stat = "identity",position=position_dodge(width=0.9))+theme_bw()+theme_classic()+theme(axis.text.x=David)+theme(axis.text.y=David)
