library(readxl)
Exp_2105_catfish_prebiotic <- read_excel("C:/Users/Admin/Desktop/Exp 2105 catfish prebiotic.xlsx", 
     sheet = "Sum", col_types = c("text", 
         "text", "numeric", "numeric", "numeric", 
         "numeric", "numeric", "numeric", 
         "numeric", "numeric"))
attach(Exp_2105_catfish_prebiotic)
require(multcomp)
require(ggplot2)
require(lsmeans)
require(ggpubr)
Exp_2105_catfish_prebiotic$System=as.factor(Exp_2105_catfish_prebiotic$System)
Exp_2105_catfish_prebiotic$Probiotic=as.factor(Exp_2105_catfish_prebiotic$Probiotic)
str(Exp_2105_catfish_prebiotic)
## tibble [40 x 10] (S3: tbl_df/tbl/data.frame)
##  $ System                  : Factor w/ 2 levels "Flow-through",..: 1 1 1 1 1 1 1 1 1 1 ...
##  $ Probiotic               : Factor w/ 3 levels "AP90","Biowish",..: 3 1 2 3 1 3 2 3 1 1 ...
##  $ Initial_Weight (g)      : num [1:40] 37.1 33.1 38.6 36.3 35.6 ...
##  $ Final_Weight (g)        : num [1:40] 42.5 50.1 46.8 46.1 44.3 ...
##  $ Weight_Gain (g)         : num [1:40] 5.34 17.03 8.16 9.78 8.71 ...
##  $ DWG (g/fish/day)        : num [1:40] 0.198 0.631 0.302 0.362 0.323 ...
##  $ SR (%)                  : num [1:40] 100 100 100 100 100 90 100 90 100 100 ...
##  $ Mortality (%)           : num [1:40] 0 0 0 0 0 10 0 10 0 0 ...
##  $ Feed_intake (g/fish/day): num [1:40] 7.81 7.81 7.81 7.81 7.81 ...
##  $ FCR                     : num [1:40] 1.462 0.458 0.957 0.798 0.896 ...
plot=ggline(Exp_2105_catfish_prebiotic,x="System",y="Weight_Gain (g)",color="Probiotic",add=c("mean_se","dotplot"),palette = c("black","pink","blue"))
plot
## `stat_bindot()` using `bins = 30`. Pick better value with `binwidth`.

model=lm(`Weight_Gain (g)`~System*Probiotic,data=Exp_2105_catfish_prebiotic)
summary(model)
## 
## Call:
## lm(formula = `Weight_Gain (g)` ~ System * Probiotic, data = Exp_2105_catfish_prebiotic)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.3684 -2.5865 -0.5788  1.8382 14.7249 
## 
## Coefficients:
##                             Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                10.711667   2.008993   5.332 6.37e-06 ***
## SystemRAS                   0.126528   2.841145   0.045    0.965    
## ProbioticBiowish           -0.005741   2.841145  -0.002    0.998    
## ProbioticControl            1.315185   2.841145   0.463    0.646    
## SystemRAS:ProbioticBiowish  1.578062   3.945583   0.400    0.692    
## SystemRAS:ProbioticControl  1.855055   3.846928   0.482    0.633    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.921 on 34 degrees of freedom
## Multiple R-squared:  0.07374,    Adjusted R-squared:  -0.06247 
## F-statistic: 0.5414 on 5 and 34 DF,  p-value: 0.7436
plot1=ggline(Exp_2105_catfish_prebiotic,x="System",y="Mortality (%)",color="Probiotic",add=c("mean_se","dotplot"),palette = c("black","pink","blue"))
plot1
## `stat_bindot()` using `bins = 30`. Pick better value with `binwidth`.