M. Drew LaMar
March 15, 2019
library(tidyverse)
mydata <- read_csv("IONTW_Raft experiment-table.csv", skip=6)
mydata %>% mutate(frac = `count turtles with [ infectious? ]`/(550 - `num/frac`)) %>%
ggplot(aes(x = `num/frac`, y = frac)) +
stat_summary(fun.data = "mean_cl_boot",
fun.args = list(conf.int = 0.95),
size = 1,
geom = "errorbar",
width = 0.1) +
stat_summary(fun.y = "mean",
geom = "line") +
stat_summary(fun.y = "mean",
geom = "point",
shape=21,
size=1.5,
fill="white") +
labs(x = "Number of vaccinated individuals",
y = "Percentage of unvaccinated infected with measles")