library(BSDA)
## Warning: package 'BSDA' was built under R version 4.0.3
## Loading required package: lattice
## 
## Attaching package: 'BSDA'
## The following object is masked from 'package:datasets':
## 
##     Orange

6a

tsum.test(107.7, 9.5, 195, 115.3, 14.9, 96)
## 
##  Welch Modified Two-Sample t-Test
## 
## data:  Summarized x and y
## t = -4.5619, df = 134.2, p-value = 1.131e-05
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  -10.894936  -4.305064
## sample estimates:
## mean of x mean of y 
##     107.7     115.3

8a

ecoli <- c(20, 11)
no.germ <- c(8, 32)
mice.test <- data.frame(ecoli, no.germ)
chisq.test(mice.test)
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  mice.test
## X-squared = 12.687, df = 1, p-value = 0.0003683