]> nmode's Git Repositories - Rnaught/blob - R/seq_bayes.R
107d428276229e7d8a3ebc27af18d1e586717419
[Rnaught] / R / seq_bayes.R
1 #' Sequential Bayes (seqB)
2 #'
3 #' This function implements a sequential Bayesian estimation method of R0 due to
4 #' Bettencourt and Riberio (PloS One, 2008). See details for important
5 #' implementation notes.
6 #'
7 #' The method sets a uniform prior distribution on R0 with possible values
8 #' between `0` and `kappa`, discretized to a fine grid. The distribution of R0
9 #' is then updated sequentially, with one update for each new case count
10 #' observation. The final estimate of R0 is the mean of the (last) posterior
11 #' distribution. The prior distribution is the initial belief of the
12 #' distribution of R0, which is the uninformative uniform distribution with
13 #' values between `0` and `kappa`. Users can change the value of `kappa` only
14 #' (i.e., the prior distribution cannot be changed from the uniform). As more
15 #' case counts are observed, the influence of the prior distribution should
16 #' lessen on the final estimate.
17 #'
18 #' This method is based on an approximation of the SIR model, which is most
19 #' valid at the beginning of an epidemic. The method assumes that the mean of
20 #' the serial distribution (sometimes called the serial interval) is known. The
21 #' final estimate can be quite sensitive to this value, so sensitivity testing
22 #' is strongly recommended. Users should be careful about units of time (e.g.,
23 #' are counts observed daily or weekly?) when implementing.
24 #'
25 #' Our code has been modified to provide an estimate even if case counts equal
26 #' to zero are present in some time intervals. This is done by grouping the
27 #' counts over such periods of time. Without grouping, and in the presence of
28 #' zero counts, no estimate can be provided.
29 #'
30 #' @param cases Vector of case counts. The vector must only contain non-negative
31 #' integers, and have at least two positive integers.
32 #' @param mu Mean of the serial distribution. This must be a positive number.
33 #' The value should match the case counts in time units. For example, if case
34 #' counts are weekly and the serial distribution has a mean of seven days,
35 #' then `mu` should be set to `1`. If case counts are daily and the serial
36 #' distribution has a mean of seven days, then `mu` should be set to `7`.
37 #' @param kappa Largest possible value of the uniform prior (defaults to `20`).
38 #' This must be a number greater than or equal to `1`. It describes the prior
39 #' belief on the ranges of R0, and should be set to a higher value if R0 is
40 #' believed to be larger.
41 #' @param post Whether to return the posterior distribution of R0 instead of the
42 #' estimate of R0 (defaults to `FALSE`). This must be a value identical to
43 #' `TRUE` or `FALSE`.
44 #'
45 #' @return If `post` is identical to `TRUE`, a list containing the following
46 #' components is returned:
47 #' * `supp` - the support of the posterior distribution of R0
48 #' * `pmf` - the probability mass function of the posterior distribution
49 #'
50 #' Otherwise, if `post` is identical to `FALSE`, only the estimate of R0 is
51 #' returned. Note that the estimate is equal to `sum(supp * pmf)` (i.e., the
52 #' posterior mean).
53 #'
54 #' @references
55 #' [Bettencourt and Riberio (PloS One, 2008)](
56 #' https://doi.org/10.1371/journal.pone.0002185)
57 #'
58 #' @export
59 #'
60 #' @examples
61 #' # Weekly data.
62 #' cases <- c(1, 4, 10, 5, 3, 4, 19, 3, 3, 14, 4)
63 #'
64 #' # Obtain R0 when the serial distribution has a mean of five days.
65 #' seq_bayes(cases, mu = 5 / 7)
66 #'
67 #' # Obtain R0 when the serial distribution has a mean of three days.
68 #' seq_bayes(cases, mu = 3 / 7)
69 #'
70 #' # Obtain R0 when the serial distribution has a mean of seven days, and R0 is
71 #' # believed to be at most 4.
72 #' estimate <- seq_bayes(cases, mu = 1, kappa = 4)
73 #'
74 #' # Same as above, but return the posterior distribution instead of the
75 #' # estimate.
76 #' posterior <- seq_bayes(cases, mu = 1, kappa = 4, post = TRUE)
77 #'
78 #' # Note that the following always holds:
79 #' estimate == sum(posterior$supp * posterior$pmf)
80 seq_bayes <- function(cases, mu, kappa = 20, post = FALSE) {
81 if (any(cases == 0)) {
82 times <- which(cases > 0)
83 if (length(times) < 2) {
84 stop("Vector of case counts must contain at least two positive integers.")
85 }
86 cases <- cases[times]
87 } else {
88 times <- seq_along(cases)
89 }
90
91 support <- seq(0, kappa, 0.01)
92 tau <- diff(times)
93
94 prior <- rep(1, kappa / 0.01 + 1)
95 prior <- prior / sum(prior)
96 posterior <- seq(0, length(prior))
97
98 for (i in seq_len(length(cases) - 1)) {
99 lambda <- tau[i] / mu * (support - 1) + log(cases[i])
100 log_like <- cases[i + 1] * lambda - exp(lambda)
101 max_log_like <- max(log_like)
102
103 if (max_log_like > 700) {
104 log_like <- log_like - max_log_like + 700
105 }
106
107 posterior <- exp(log_like) * prior
108 posterior <- posterior / sum(posterior)
109 prior <- posterior
110 }
111
112 if (!post) {
113 return(sum(support * posterior))
114 }
115 list(supp = support, pmf = posterior)
116 }