Testing Your Program

M. Drew LaMar
March 15, 2019

Class announcements

  • Chapters 6-8 of Railsback & Grimm are on Blackboard
  • We'll be discussing Chapter 5 and 6 today
  • Exam #2 will be posted to Blackboard this weekend (you will have 3 weeks to complete the exam)
  • NO CLASS OR LAB next Thursday or Friday
    • Please use this time to work on your HW and Exam

Raft Debate

Measles Outbreak

How I used NetLogo to plan my activity at the Raft Debate

Measles Outbreak

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")

Measles Outbreak

plot of chunk unnamed-chunk-1