Remove all objects from workspace.

remove (list = objects() ) 

load package

library(EpiModel)
## Loading required package: deSolve
## 
## Attaching package: 'deSolve'
## 
## The following object is masked from 'package:graphics':
## 
##     matplot
## 
## Loading required package: networkDynamic
## Loading required package: network
## network: Classes for Relational Data
## Version 1.13.0 created on 2015-08-31.
## copyright (c) 2005, Carter T. Butts, University of California-Irvine
##                     Mark S. Handcock, University of California -- Los Angeles
##                     David R. Hunter, Penn State University
##                     Martina Morris, University of Washington
##                     Skye Bender-deMoll, University of Washington
##  For citation information, type citation("network").
##  Type help("network-package") to get started.
## 
## 
## networkDynamic: version 0.8.1, created on 2015-10-06
## Copyright (c) 2015, Carter T. Butts, University of California -- Irvine
##                     Ayn Leslie-Cook, University of Washington
##                     Pavel N. Krivitsky, University of Wollongong
##                     Skye Bender-deMoll, University of Washington
##                     with contributions from
##                     Zack Almquist, University of California -- Irvine
##                     David R. Hunter, Penn State University
##                     Li Wang
##                     Kirk Li, University of Washington
##                     Steven M. Goodreau, University of Washington
##                     Jeffrey Horner
##                     Martina Morris, University of Washington
## Based on "statnet" project software (statnet.org).
## For license and citation information see statnet.org/attribution
## or type citation("networkDynamic").
## 
## Loading required package: tergm
## Loading required package: statnet.common
## Loading required package: ergm
## 
## ergm: version 3.4.0, created on 2015-06-16
## Copyright (c) 2015, Mark S. Handcock, University of California -- Los Angeles
##                     David R. Hunter, Penn State University
##                     Carter T. Butts, University of California -- Irvine
##                     Steven M. Goodreau, University of Washington
##                     Pavel N. Krivitsky, University of Wollongong
##                     Martina Morris, University of Washington
##                     with contributions from
##                     Li Wang
##                     Kirk Li, University of Washington
## Based on "statnet" project software (statnet.org).
## For license and citation information see statnet.org/attribution
## or type citation("ergm").
## 
## NOTE: If you use custom ERGM terms based on 'ergm.userterms'
## version prior to 3.1, you will need to perform a one-time update
## of the package boilerplate files (the files that you did not write
## or modify) from 'ergm.userterms' 3.1 or later. See
## help('eut-upgrade') for instructions.
## 
## 
## Attaching package: 'ergm'
## 
## The following objects are masked from 'package:network':
## 
##     as.edgelist, as.edgelist.matrix, as.edgelist.network
## Warning: replacing previous import by 'network::as.edgelist.network' when
## loading 'tergm'
## Warning: replacing previous import by 'network::as.edgelist.matrix' when
## loading 'tergm'
## Warning: replacing previous import by 'network::as.edgelist' when loading
## 'tergm'
## 
## tergm: version 3.3.0, created on 2015-06-14
## Copyright (c) 2015, Pavel N. Krivitsky, University of Wollongong
##                     Mark S. Handcock, University of California -- Los Angeles
##                     with contributions from
##                     David R. Hunter, Penn State University
##                     Steven M. Goodreau, University of Washington
##                     Martina Morris, University of Washington
##                     Nicole Bohme Carnegie, New York University
##                     Carter T. Butts, University of California -- Irvine
##                     Ayn Leslie-Cook, University of Washington
##                     Skye Bender-deMoll
##                     Li Wang
##                     Kirk Li, University of Washington
## Based on "statnet" project software (statnet.org).
## For license and citation information see statnet.org/attribution
## or type citation("tergm").
## Warning: replacing previous import by 'network::as.edgelist.network' when
## loading 'EpiModel'
## Warning: replacing previous import by 'network::as.edgelist.matrix' when
## loading 'EpiModel'
## Warning: replacing previous import by 'network::as.edgelist' when loading
## 'EpiModel'

Construct empty network

nw = network.initialize (n=150, directed =FALSE)
nw = set.vertex.attribute (nw, "race", rep(0:1, each = 75))

specify partnership

formation = ~edges + nodefactor("race") + nodematch("race") + concurrent

calculate target statistics

target.stats = c(30, 30, 23, 25)

construct dissolution model

coef.diss = dissolution_coefs(dissolution = ~offset(edges), duration = 15 )
coef.diss
## Dissolution Coefficients
## =======================
## Dissolution Model: ~offset(edges)
## Edge Duration: 15
## Crude Coefficient: 2.639057
## Adjusted Coefficient: 2.639057
## Death rate: 0

model fit

function (nw, formation, target.stats, coef.diss, constraints, 
    coef.form = NULL, edapprox = TRUE, output = "fit", set.control.ergm, 
    set.control.stergm, nonconv.error = FALSE, verbose = FALSE) 
NULL 
## function (nw, formation, target.stats, coef.diss, constraints, 
##     coef.form = NULL, edapprox = TRUE, output = "fit", set.control.ergm, 
##     set.control.stergm, nonconv.error = FALSE, verbose = FALSE) 
## NULL

construct network model

est1 <- netest(nw, formation, target.stats, coef.diss, edapprox = TRUE)
## Starting maximum likelihood estimation via MCMLE:
## Iteration 1 of at most 20: 
## The log-likelihood improved by 3.307 
## Iteration 2 of at most 20: 
## The log-likelihood improved by 0.4632 
## Step length converged once. Increasing MCMC sample size.
## Iteration 3 of at most 20: 
## The log-likelihood improved by 0.03041 
## Step length converged twice. Stopping.
## 
## This model was fit using MCMC.  To examine model diagnostics and check for degeneracy, use the mcmc.diagnostics() function.

model diagnosis

dx <- netdx(est1, nsims = 5, nsteps = 120,
            nwstats.formula = ~edges + nodefactor("race", base = 0) +                  nodematch("race") + concurrent)
## 
## Network Diagnostics
## -----------------------
## - Simulating 5 networks
##   |*****|
## - Calculating formation statistics
## - Calculating duration statistics
##   |*****|
## - Calculating dissolution statistics
##   |*****|
## 
dx
## EpiModel Network Diagnostics
## =======================
## Diagnostic Method: Dynamic
## Simulations: 5
## Time Steps per Sim: 120
## 
## Formation Diagnostics
## ----------------------- 
##                   Target Sim Mean Pct Diff Sim SD
## edges                 30   33.500    0.117 12.803
## nodefactor.race.0     NA   31.020       NA 17.387
## nodefactor.race.1     30   35.980    0.199 11.407
## nodematch.race        23   25.737    0.119 10.861
## concurrent            25   26.672    0.067 11.223
## 
## Dissolution Diagnostics
## ----------------------- 
##                Target Sim Mean Pct Diff Sim SD
## Edge Duration  15.000   12.965   -0.136 11.576
## Pct Edges Diss  0.067    0.068    0.020  0.047

Plot diagnosis

par(mar = c(3,3,1,1), mgp = c(2,1,0))
plot(dx)

Dissolution model fit

par(mfrow = c(1, 2))
plot(dx, type = "duration")
plot(dx, type = "dissolution")

Input epidemic parameter

param <- param.net(inf.prob = 0.4, act.rate = 4, rec.rate = 0.125)

initial condition

init <- init.net(i.num=15)

control setting

control <- control.net(type = "SIS", nsteps = 120, nsims = 5, epi.by = "race")

simulate model

sim1 <- netsim(est1, param, init, control)
## 
## * Starting Network Simulation
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 2/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 12
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 3/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 13
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 4/120
## Incidence: 3
## Recoveries: 0
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 5/120
## Incidence: 4
## Recoveries: 0
## Prevalence: 20
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 6/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 19
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 7/120
## Incidence: 6
## Recoveries: 1
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 8/120
## Incidence: 9
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 9/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 10/120
## Incidence: 10
## Recoveries: 4
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 11/120
## Incidence: 10
## Recoveries: 7
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 12/120
## Incidence: 10
## Recoveries: 6
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 13/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 14/120
## Incidence: 7
## Recoveries: 9
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 15/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 16/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 17/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 18/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 19/120
## Incidence: 9
## Recoveries: 8
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 20/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 21/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 22/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 23/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 24/120
## Incidence: 8
## Recoveries: 10
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 25/120
## Incidence: 12
## Recoveries: 9
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 26/120
## Incidence: 12
## Recoveries: 17
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 27/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 28/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 29/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 30/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 31/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 32/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 33/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 34/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 35/120
## Incidence: 7
## Recoveries: 9
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 36/120
## Incidence: 3
## Recoveries: 6
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 37/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 38/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 39/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 40/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 41/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 42/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 43/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 44/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 45/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 46/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 47/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 48/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 49/120
## Incidence: 2
## Recoveries: 5
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 50/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 51/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 52/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 53/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 54/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 55/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 56/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 57/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 58/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 59/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 60/120
## Incidence: 6
## Recoveries: 8
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 61/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 62/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 63/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 64/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 65/120
## Incidence: 6
## Recoveries: 9
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 66/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 67/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 68/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 69/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 70/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 71/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 72/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 73/120
## Incidence: 8
## Recoveries: 4
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 74/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 75/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 76/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 77/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 78/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 79/120
## Incidence: 4
## Recoveries: 8
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 80/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 81/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 82/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 83/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 84/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 85/120
## Incidence: 3
## Recoveries: 5
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 86/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 87/120
## Incidence: 9
## Recoveries: 8
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 88/120
## Incidence: 9
## Recoveries: 3
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 89/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 90/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 91/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 92/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 93/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 94/120
## Incidence: 4
## Recoveries: 7
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 95/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 96/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 97/120
## Incidence: 5
## Recoveries: 2
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 98/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 99/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 100/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 101/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 102/120
## Incidence: 8
## Recoveries: 9
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 103/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 104/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 105/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 106/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 107/120
## Incidence: 4
## Recoveries: 9
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 108/120
## Incidence: 9
## Recoveries: 4
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 109/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 110/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 111/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 112/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 113/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 114/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 115/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 116/120
## Incidence: 9
## Recoveries: 9
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 117/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 118/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 119/120
## Incidence: 10
## Recoveries: 5
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 1/5
## Timestep: 120/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 2/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 3/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 15
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 4/120
## Incidence: 1
## Recoveries: 0
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 5/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 6/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 15
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 7/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 17
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 8/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 9/120
## Incidence: 3
## Recoveries: 0
## Prevalence: 19
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 10/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 19
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 11/120
## Incidence: 4
## Recoveries: 1
## Prevalence: 22
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 12/120
## Incidence: 5
## Recoveries: 2
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 13/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 14/120
## Incidence: 6
## Recoveries: 2
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 15/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 16/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 17/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 18/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 19/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 20/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 21/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 22/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 23/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 24/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 25/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 26/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 27/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 28/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 29/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 30/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 31/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 32/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 33/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 34/120
## Incidence: 0
## Recoveries: 0
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 35/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 36/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 37/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 38/120
## Incidence: 5
## Recoveries: 8
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 39/120
## Incidence: 3
## Recoveries: 6
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 40/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 41/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 42/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 43/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 44/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 45/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 46/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 47/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 48/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 49/120
## Incidence: 3
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 50/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 51/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 52/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 53/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 54/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 55/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 56/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 57/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 58/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 59/120
## Incidence: 8
## Recoveries: 8
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 60/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 61/120
## Incidence: 1
## Recoveries: 4
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 62/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 63/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 64/120
## Incidence: 0
## Recoveries: 0
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 65/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 66/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 67/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 68/120
## Incidence: 4
## Recoveries: 7
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 69/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 70/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 71/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 72/120
## Incidence: 9
## Recoveries: 3
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 73/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 74/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 75/120
## Incidence: 0
## Recoveries: 0
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 76/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 77/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 78/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 79/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 80/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 81/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 82/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 83/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 84/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 85/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 86/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 87/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 88/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 89/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 90/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 91/120
## Incidence: 10
## Recoveries: 10
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 92/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 93/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 94/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 95/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 96/120
## Incidence: 11
## Recoveries: 12
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 97/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 98/120
## Incidence: 8
## Recoveries: 5
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 99/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 100/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 101/120
## Incidence: 8
## Recoveries: 10
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 102/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 103/120
## Incidence: 9
## Recoveries: 6
## Prevalence: 51
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 104/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 105/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 106/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 107/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 108/120
## Incidence: 6
## Recoveries: 8
## Prevalence: 51
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 109/120
## Incidence: 10
## Recoveries: 8
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 110/120
## Incidence: 9
## Recoveries: 9
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 111/120
## Incidence: 9
## Recoveries: 14
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 112/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 48
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 113/120
## Incidence: 11
## Recoveries: 10
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 114/120
## Incidence: 5
## Recoveries: 8
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 115/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 116/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 117/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 118/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 119/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 2/5
## Timestep: 120/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 2/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 14
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 3/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 16
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 4/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 17
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 5/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 20
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 6/120
## Incidence: 9
## Recoveries: 6
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 7/120
## Incidence: 6
## Recoveries: 1
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 8/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 9/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 10/120
## Incidence: 8
## Recoveries: 3
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 11/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 12/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 13/120
## Incidence: 7
## Recoveries: 3
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 14/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 15/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 16/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 17/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 18/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 19/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 20/120
## Incidence: 9
## Recoveries: 8
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 21/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 47
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 22/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 50
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 23/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 24/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 51
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 25/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 26/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 49
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 27/120
## Incidence: 10
## Recoveries: 7
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 28/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 29/120
## Incidence: 10
## Recoveries: 5
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 30/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 31/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 32/120
## Incidence: 8
## Recoveries: 8
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 33/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 34/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 35/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 36/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 37/120
## Incidence: 6
## Recoveries: 10
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 38/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 39/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 40/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 41/120
## Incidence: 10
## Recoveries: 12
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 42/120
## Incidence: 11
## Recoveries: 8
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 43/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 44/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 45/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 46/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 47/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 48/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 49/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 50/120
## Incidence: 9
## Recoveries: 8
## Prevalence: 62
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 51/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 62
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 52/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 62
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 53/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 64
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 54/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 65
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 55/120
## Incidence: 8
## Recoveries: 11
## Prevalence: 62
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 56/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 63
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 57/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 64
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 58/120
## Incidence: 8
## Recoveries: 6
## Prevalence: 66
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 59/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 65
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 60/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 64
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 61/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 66
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 62/120
## Incidence: 5
## Recoveries: 8
## Prevalence: 63
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 63/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 63
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 64/120
## Incidence: 6
## Recoveries: 8
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 65/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 66/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 63
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 67/120
## Incidence: 10
## Recoveries: 10
## Prevalence: 63
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 68/120
## Incidence: 6
## Recoveries: 8
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 69/120
## Incidence: 10
## Recoveries: 10
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 70/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 71/120
## Incidence: 8
## Recoveries: 8
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 72/120
## Incidence: 10
## Recoveries: 8
## Prevalence: 62
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 73/120
## Incidence: 10
## Recoveries: 11
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 74/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 75/120
## Incidence: 11
## Recoveries: 13
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 76/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 77/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 78/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 60
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 79/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 80/120
## Incidence: 6
## Recoveries: 12
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 81/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 82/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 83/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 84/120
## Incidence: 8
## Recoveries: 9
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 85/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 86/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 87/120
## Incidence: 11
## Recoveries: 9
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 88/120
## Incidence: 10
## Recoveries: 12
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 89/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 90/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 91/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 92/120
## Incidence: 10
## Recoveries: 6
## Prevalence: 61
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 93/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 94/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 95/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 96/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 97/120
## Incidence: 9
## Recoveries: 12
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 98/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 99/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 100/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 101/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 102/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 103/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 104/120
## Incidence: 11
## Recoveries: 10
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 105/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 106/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 107/120
## Incidence: 10
## Recoveries: 11
## Prevalence: 53
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 108/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 109/120
## Incidence: 8
## Recoveries: 8
## Prevalence: 54
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 110/120
## Incidence: 5
## Recoveries: 9
## Prevalence: 50
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 111/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 52
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 112/120
## Incidence: 10
## Recoveries: 7
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 113/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 114/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 59
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 115/120
## Incidence: 9
## Recoveries: 10
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 116/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 117/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 57
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 118/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 58
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 119/120
## Incidence: 9
## Recoveries: 11
## Prevalence: 56
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 3/5
## Timestep: 120/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 55
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 2/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 19
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 3/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 21
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 4/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 21
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 5/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 6/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 7/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 8/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 9/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 10/120
## Incidence: 7
## Recoveries: 3
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 11/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 12/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 13/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 14/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 15/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 16/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 17/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 18/120
## Incidence: 8
## Recoveries: 8
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 19/120
## Incidence: 8
## Recoveries: 9
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 20/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 21/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 22/120
## Incidence: 3
## Recoveries: 5
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 23/120
## Incidence: 6
## Recoveries: 9
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 24/120
## Incidence: 8
## Recoveries: 4
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 25/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 26/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 27/120
## Incidence: 10
## Recoveries: 8
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 28/120
## Incidence: 6
## Recoveries: 9
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 29/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 30/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 31/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 32/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 33/120
## Incidence: 9
## Recoveries: 7
## Prevalence: 46
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 34/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 45
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 35/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 36/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 44
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 37/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 38/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 39/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 40/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 41/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 42/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 43/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 44/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 45/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 46/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 47/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 43
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 48/120
## Incidence: 8
## Recoveries: 9
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 49/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 42
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 50/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 41
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 51/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 40
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 52/120
## Incidence: 8
## Recoveries: 11
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 53/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 54/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 55/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 56/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 57/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 58/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 59/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 60/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 61/120
## Incidence: 4
## Recoveries: 10
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 62/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 63/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 64/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 65/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 66/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 67/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 68/120
## Incidence: 4
## Recoveries: 7
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 69/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 70/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 71/120
## Incidence: 6
## Recoveries: 3
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 72/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 73/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 74/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 75/120
## Incidence: 2
## Recoveries: 5
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 76/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 77/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 78/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 79/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 23
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 80/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 81/120
## Incidence: 1
## Recoveries: 0
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 82/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 83/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 84/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 24
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 85/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 86/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 87/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 88/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 89/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 90/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 91/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 92/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 93/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 94/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 95/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 96/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 97/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 98/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 99/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 100/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 101/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 102/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 103/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 104/120
## Incidence: 6
## Recoveries: 4
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 105/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 106/120
## Incidence: 4
## Recoveries: 2
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 107/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 108/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 109/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 110/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 111/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 112/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 113/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 114/120
## Incidence: 1
## Recoveries: 3
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 115/120
## Incidence: 9
## Recoveries: 4
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 116/120
## Incidence: 10
## Recoveries: 9
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 117/120
## Incidence: 5
## Recoveries: 9
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 118/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 119/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 4/5
## Timestep: 120/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 2/120
## Incidence: 5
## Recoveries: 1
## Prevalence: 17
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 3/120
## Incidence: 5
## Recoveries: 2
## Prevalence: 20
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 4/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 22
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 5/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 22
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 6/120
## Incidence: 4
## Recoveries: 1
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 7/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 8/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 9/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 10/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 11/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 12/120
## Incidence: 3
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 13/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 14/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 15/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 16/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 17/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 18/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 19/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 20/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 21/120
## Incidence: 9
## Recoveries: 6
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 22/120
## Incidence: 8
## Recoveries: 7
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 23/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 24/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 38
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 25/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 26/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 39
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 27/120
## Incidence: 3
## Recoveries: 6
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 28/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 29/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 30/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 31/120
## Incidence: 1
## Recoveries: 4
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 32/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 33/120
## Incidence: 2
## Recoveries: 1
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 34/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 35/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 36/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 37/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 38/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 39/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 40/120
## Incidence: 1
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 41/120
## Incidence: 3
## Recoveries: 5
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 42/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 43/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 44/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 45/120
## Incidence: 1
## Recoveries: 0
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 46/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 47/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 48/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 49/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 50/120
## Incidence: 0
## Recoveries: 0
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 51/120
## Incidence: 6
## Recoveries: 10
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 52/120
## Incidence: 5
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 53/120
## Incidence: 2
## Recoveries: 3
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 54/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 55/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 56/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 57/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 58/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 59/120
## Incidence: 7
## Recoveries: 5
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 60/120
## Incidence: 3
## Recoveries: 1
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 61/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 62/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 63/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 64/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 65/120
## Incidence: 7
## Recoveries: 6
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 66/120
## Incidence: 6
## Recoveries: 5
## Prevalence: 32
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 67/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 68/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 69/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 70/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 71/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 72/120
## Incidence: 6
## Recoveries: 6
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 73/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 74/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 75/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 76/120
## Incidence: 7
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 77/120
## Incidence: 9
## Recoveries: 5
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 78/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 79/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 80/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 81/120
## Incidence: 4
## Recoveries: 6
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 82/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 83/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 37
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 84/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 85/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 36
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 86/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 87/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 35
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 88/120
## Incidence: 7
## Recoveries: 8
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 89/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 34
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 90/120
## Incidence: 6
## Recoveries: 7
## Prevalence: 33
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 91/120
## Incidence: 5
## Recoveries: 7
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 92/120
## Incidence: 7
## Recoveries: 7
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 93/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 94/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 95/120
## Incidence: 1
## Recoveries: 0
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 96/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 97/120
## Incidence: 4
## Recoveries: 5
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 98/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 99/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 100/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 101/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 102/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 103/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 104/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 105/120
## Incidence: 5
## Recoveries: 6
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 106/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 107/120
## Incidence: 5
## Recoveries: 5
## Prevalence: 31
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 108/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 29
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 109/120
## Incidence: 5
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 110/120
## Incidence: 4
## Recoveries: 4
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 111/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 112/120
## Incidence: 5
## Recoveries: 3
## Prevalence: 30
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 113/120
## Incidence: 2
## Recoveries: 4
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 114/120
## Incidence: 3
## Recoveries: 3
## Prevalence: 28
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 115/120
## Incidence: 3
## Recoveries: 4
## Prevalence: 27
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 116/120
## Incidence: 1
## Recoveries: 3
## Prevalence: 25
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 117/120
## Incidence: 4
## Recoveries: 3
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 118/120
## Incidence: 2
## Recoveries: 2
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 119/120
## Incidence: 1
## Recoveries: 1
## Prevalence: 26
## Population: 150
## ----------------------------
## Epidemic Simulation
## ----------------------------
## Simulation: 5/5
## Timestep: 120/120
## Incidence: 0
## Recoveries: 1
## Prevalence: 25
## Population: 150
## ----------------------------

summary

sim1
## EpiModel Simulation
## =======================
## Model class: netsim
## 
## Simulation Summary
## -----------------------
## Model type: SIS
## No. simulations: 5
## No. time steps: 120
## No. NW modes: 1
## 
## Model Parameters
## -----------------------
## inf.prob = 0.4
## act.rate = 4
## rec.rate = 0.125
## 
## Model Output
## -----------------------
## Compartments: s.num s.num.race0 s.num.race1 i.num 
## i.num.race0 i.num.race1 num num.race0 num.race1
## Flows: is.flow si.flow
## Networks: sim1 ... sim5
## Transmissions: sim1 ... sim5
summary(sim1, at = 120)
## 
## EpiModel Summary
## =======================
## Model class: netsim
## 
## Simulation Details
## -----------------------
## Model type: SIS
## No. simulations: 5
## No. time steps: 120
## No. NW modes: 1
## 
## Model Statistics
## ------------------------------
## Time: 120 
## ------------------------------ 
##            mean      sd    pct
## Suscept.  107.8  13.590  0.719
## Infect.    42.2  13.590  0.281
## Total     150.0   0.000  1.000
## S -> I      4.8   3.271     NA
## I -> S      4.6   2.302     NA
## ------------------------------

simulate networkDynamic

nw <- get_network(sim1, sim = 2)
nw
## NetworkDynamic properties:
##   distinct change times: 120 
##   maximal time range: -Inf until  Inf 
## 
##  Dynamic (TEA) attributes:
##   Vertex TEAs:    testatus.active 
## 
## Includes optional net.obs.period attribute:
##  Network observation period info:
##   Number of observation spells: 2 
##   Maximal time range observed: 1 until 121 
##   Temporal mode: discrete 
##   Time unit: step 
##   Suggested time increment: 1 
## 
##  Network attributes:
##   vertices = 150 
##   directed = FALSE 
##   hyper = FALSE 
##   loops = FALSE 
##   multiple = FALSE 
##   bipartite = FALSE 
##   net.obs.period: (not shown)
##   vertex.pid = vertex.pid 
##   edge.pid = edge.pid 
##   total edges= 249 
##     missing edges= 0 
##     non-missing edges= 249 
## 
##  Vertex attribute names: 
##     active race testatus.active vertex.names vertex.pid 
## 
##  Edge attribute names: 
##     active edge.pid

Plotting

par(mfrow = c(1,1), mar = c(3,3,1,1), mgp = c(2,1,0))
plot(sim1)

Plot individual simulation lines

plot(sim1, mean.line = FALSE, qnts = FALSE, sim.lines = TRUE)

plot the disease incidence and recoveries

plot(sim1, y = c("si.flow", "is.flow"), qnts = 1, leg = TRUE)

Plot compare the results by race

plot(sim1, y = c("i.num.race0", "i.num.race1"), leg = TRUE)

Plotting the static network at different time steps and over different simulations

par(mfrow = c(1,2), mar = c(0,0,1,0))
plot(sim1, type = "network", at = 1, col.status = TRUE,
     main = "Prevalence at t1")
plot(sim1, type = "network", at = 120, col.status = TRUE,
     main = "Prevalence at t120")