ANSWERS

Task 1. The simple SIR model, implemented in R

Here is the implementation in R:

require(deSolve)    # the R-package for solving the model

# initial conditions, units of number of individuals (in the Netherlands)
state.SIR   <- c(S = 17500000, I = 1000, R = 0, Deceased = 0)

# model parameters
parms.SIR   <- c(
  b = 0.00000002,    # [1/ind/d], infection parameter 
  g = 0.07,          # [1/d],     recovery rate of infected individuals
  m = 0.007          # [1/d],     mortality rate of infected individuals
)

# model function
SIR <- function(t, state, parms) {
  with (as.list(c(state, parms)), {

    # rate expressions
    Infection  <- b*S*I
    Recovery   <- g*I
    Mortality  <- m*I

    # mass balance equations
    dS          <- -Infection 
    dI          <-  Infection - Recovery - Mortality
    dR          <-  Recovery
    dDeceased   <-  Mortality    # to track number of deceased people

    # average duration of infection and the Reproduction number
    tau  <- 1/(g+m)
    RN <- b*tau*S

    return (list(c(dS, dI, dR, dDeceased),  # the time derivatives
                 ReproductionNumber = RN,   # extra output variables
                 Population = S + I + R))
  }) 
}

# running the model
time.seq   <- seq(from = 0, to = 365, by = 1)   # time sequence, in days

# default run, business as usual scenario
out <- ode(y = state.SIR, times = time.seq, func = SIR, parms = parms.SIR)

# plot the results
plot(out, las = 1, col=1:2, lty=1)

Task 2. Vaccination and immunity loss

Task 3. Hospitalisations

The easiest way to track the number of people in hospitals is

Task 4. Updated model

The conceptual diagram describing the full COVID-19 model and the corresponding set of differential equations are therefore:

Conceptual scheme of the COVID-19 model{width=80%}

$$\frac{dS}{dt} = ImmunityLoss - Infection - Vaccination$$ $$\frac{dI}{dt} = Infection - Mortality - Recovery - Hospitalisation$$ $$\frac{dR}{dt} = Recovery + RecoveryH + Vaccination - ImmunityLoss$$ $$\frac{dH}{dt} = Hospitalisation - MortalityH - RecoveryH$$

Task 5. Better parameter values (the Belgian situation)

The quotes from the expert are used as follows:

Task 6. Implementation in R

# the R-package for solving the model
require(deSolve)

# model parameters for Belgian case
pars      <- c(
  tau  = 10,         # [d], duration of the infectious period, free-roaming individuals
  tauH = 10,         # [d], duration of the infectious period, hospitalized individuals
  b = 2.5/11.5e6/10, # [1/ind/d], infection parameter, assuming RN=2.5, b=RN/Sini/d
  v = 0.0,           # [1/d] vaccination rate (no vaccines initially)
  g = 1/10,          # [1/d] recovery rate of free-roaming infected individuals, g=1/d
  m = 0.001/10,      # [1/d] mortality rate of free-roaming infected people, m=0.001/d
  l = 1/180,         # [1/d] immunity loss rate, l=1/(6*30)
  h = 0.2*0.8/10,    # [1/d] hospitalisation rate, h=0.8*0.2/d
  mH = 0.25*0.3/10,  # [1/d] mortality rate of hospitalised individuals, mH=0.25*0.3/dH
  gH = 1/10-0.25*0.3/10 # [1/d] recovery rate of hospitalised individuals, gH=1/dH-mH
)

# the model function
Corona <- function(t, state, parms) {
  with (as.list(c(state, parms)), {

    # rate expressions - units of [ind/day]
    Infection           <- b*S*I
    Vaccination         <- v*S
    Recovery            <- g*I
    Mortality           <- m*I    # Daily mortality of "free-roaming" infected 
    ImmunityLoss        <- l*R    # Daily loss of immunity of recovered individuals
    Hospitalisation     <- h*I    # Daily rate of hospitalizations of infected persons
    MortalityH          <- mH*H   # Mortality rate of hospitalised persons 
    RecoveryH           <- gH*H   # Recovery rate of hospitalised persons

    # mass balance equations
    dS        <- -Infection - Vaccination + ImmunityLoss
    dI        <-  Infection - Recovery - Mortality - Hospitalisation
    dR        <-  Recovery  + RecoveryH + Vaccination - ImmunityLoss
    dH        <-  Hospitalisation - RecoveryH - MortalityH
    dDeceased <-  Mortality + MortalityH # auxillary, track deceased individuals

    return (list(c(dS, dI, dR, dH, dDeceased),           # the time derivatives
                 ReproductionNumber = tau*Infection/I,   # output variables
                 MortalityRate = Mortality+MortalityH,   # daily mortality rate (ind/d)
                 MeanMortality = (Mortality+MortalityH)/(I+H) # fraction of infected 
                                                              # that die per day
                 ))
  }) 
}

Task 7. Scenarios

The model is applied to the Belgian case:

# the R-package for solving the model
require(deSolve)

# initial conditions, units of number of individuals (in Belgium)
state.ini  <- c(S = 11500000, I = 1000, R = 0, H = 0, Deceased = 0)

time.seq   <- seq(from = 0, to = 365, by = 1)

# default run, business as usual
out <- ode(y = state.ini, times = time.seq, func = Corona, parms = pars)

# run with reduced infection rate to 60% (social distancing)
pars2 <- pars
pars2["b"] <- pars2["b"]*0.6
out2 <- ode(y = state.ini, times = time.seq, func = Corona, parms = pars2)

# add vaccination
pars3 <- pars2
pars3["v"] <- 0.005
out3 <- ode(y = state.ini, times = time.seq, func = Corona, parms = pars3)

# vaccination but without social distancing
pars4 <- pars
pars4["v"] <- 0.005
out4 <- ode(y = state.ini, times = time.seq, func = Corona, parms = pars4)

par(oma = c(0,2,0,0))
plot(out, out2, out3, out4, xlab = "time", lwd = 2, lty = 1, las = 1, mfrow=c(3,3),
     ylab=c("ind","ind","ind","ind","ind","--","ind/day","%/day",""))
plot.new()
legend("top", col = 1:4, lty = 1, 
       legend = c("no measures", "soc. distancing (SD)", 
                  "vaccination+SD", "vaccination-SD"))

Final remarks

The simulations performed above are only realistic at the start of the pandemic. This is because they assume that the model parameters remain constant. However, in reality the parameters are frequently changed because the society does take measures, which themselves evolve in time. While such changes in parameter values are perfectly possible to implement in R, it would go far beyond the scope of this introductory course in modelling to explore them. Nevertheless, the exercise gives you a "taste" of how models can help design strategies in this type of circumstances.

But: as we have mentioned several times, models are just an abstraction of reality, and they cannot capture everything!



dynamic-R/RTM documentation built on Feb. 28, 2025, 1:23 p.m.