library(ggplot2)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
test <- read.csv("C:/Users/z5218946/OneDrive - UNSW/Research/Mites Rhodamine Protocol/Rhtest.csv")

alive <- read.csv("C:/Users/z5218946/OneDrive - UNSW/Research/Mites Rhodamine Protocol/alive.csv")

mated <- read.csv("C:/Users/z5218946/OneDrive - UNSW/Research/Mites Rhodamine Protocol/mated.csv")

Test: mount and yeast

prot_test <- test %>%
  filter(protocol=="mount")

ggplot(prot_test, aes(as.factor(conc), CTCF)) + geom_boxplot() + facet_grid(rhodamine~mount) + ggtitle("Mount")

yeast_yesy_1 <- test %>%
  filter(protocol!="mount") %>%
  filter(conc==1)

yeast_yesy_2 <- test %>%
  filter(protocol!="mount") %>%
  filter(conc==2)

ggplot(yeast_yesy_1, aes(as.factor(protocol), CTCF)) + geom_boxplot() + facet_grid(rhodamine~mount) + ggtitle("[1]")

ggplot(yeast_yesy_2, aes(as.factor(protocol), CTCF)) + geom_boxplot() + facet_grid(rhodamine~mount) + ggtitle("[2]")

Test: Alive

male_alive <- alive %>%
  filter(sex=="M")


ggplot(male_alive, aes(condition, CTCF)) + geom_boxplot() + facet_grid(~Rhodamine)

#Test: Mounted

ggplot(mated, aes(condition, CTCF)) + geom_boxplot() + facet_grid(~Rhodamine)