A simple discrete event simulation model of a cancer's natural history
TA Trikalinos, Y Sereda, S Chrysanthopoulou, F Alarid-Escudero
2024-10-17
Source:vignettes/Simple_des_model_cancer_natural_Hx.Rmd
Simple_des_model_cancer_natural_Hx.Rmd
The simulation world
We will model a cancer’s natural history in a population. We index people by . The following assumptions fix a simulation world.
All types of events can be modeleld with nonhomogeneous Poisson point processes (NHPPPs).
Persons are alive and cancer free at 40 years of age. No person will live past 110 years. All people can die from causes other than the cancer of interest (hereafter, death from other causes). Write for the corresponding intensity function.
Some people may be exposed to an environmental toxin, with exposure that varies over time. Write for the exposure function. Positive values mean that a person is exposed at that particular instance. (The never exposed have zeros throughout their life.) We will assume that the exposure to said toxin is a risk factor only for cancer emergence, and that the toxin has no cumulative effects – only the instantaneous exposure levels matter. Write for the effect of the toxin instantaneous exposure on developing cancer.
Some persons will develop a preclinical cancer with a time-varying intensity function .
Some preclinical cancers may progress to clinical cancer with an intensity function , at which point they are considered diagnosed.
Once people develop preclinical cancer they can die from cancer with intensity function . The cancer death rate does not explicitly depend on whether the cancer has been diagnosed or not. Thus, we have two competing causes of death: death due to cancer and due to other causes.
Setup
Load nhppp
and data.table
. (If you prefer
to not use data.table
, you should be able to implement this
example in base R
with little trouble.)
Simulation model
We now fix the mathematical description of the model. We will simulate males and females (with equal probability) from the 2015 birth cohort.
pop <- data.table(
id = 1:K,
birth_cohort = 2015,
spawn_age = 40,
max_simulation_age = 110,
sex = sample(c("male", "female"), K, replace = TRUE)
)
## It would make sense to execute the commented-out code now.
## It generates model parameters used in later stages.
## For expository clarity, we generate each parameter when it is introduced
# pop[, `:=`(
# param_cancer_emergence_shape = runif(.N, 7, 9),
# param_cancer_emergence_scale = rnorm(.N, 150, 20),
# param_toxin_exposure_diff = pmax(0.005, rnorm(.N, 0.01, 0.005)),
# param_cancer_death_intercept := rnorm(.N, -2, 0.5),
# param_cancer_death_slope := runif(n= .N, min = 0, max = 0.003),
# param_clinical_cancer_dx_rate := runif(.N, 0.20, 0.27)
# )]
Death from other causes
The death from other causes depends on the age (, measured in years), sex (male or female), and birth year of person . Function is is a piecewise constant over each year of age. It is a `regular’ step function (all steps have the same length of one year).
If the cancer is not a major cause of death, then the intensity
function for all cause deaths is a good approximation for the intensity
function for death from other causes. The internal dataset
annual_mortality_rates_2015
has all cause mortality data
for the 2015 birth cohort. It has the values of the piecewise constant
per birth cohort, sex, and age. Here is a peek at some columns.
annual_mortality_rates_2015[
sex %in% c("male", "female"),
c(1:5, 111:113)
]
#> Key: <birth_cohort, sex>
#> birth_cohort sex age_0 age_1 age_2 age_108 age_109 age_110+
#> <int> <fctr> <num> <num> <num> <num> <num> <num>
#> 1: 2015 female 0.005386 0.000350 0.000228 0.559371 0.541174 0.587413
#> 2: 2015 male 0.006404 0.000452 0.000277 0.511677 0.671391 0.386100
When we have a step (piecewise constant) intensity function
over regular time intervals (here, all one year long), we can
use nhppp
’s vdraw_sc_step_regular()
function.
We need to specify the following:
- Pass the intensities as a matrix (argument
lambda_matrix
); the number of columns in the matrix are the number of time intervals in the step function.
rhos <- annual_mortality_rates_2015[
pop,
on = c("birth_cohort", "sex")
]
setindex(rhos, "id")
rho_matrix <- as.matrix(rhos[, c(paste0("age_", 0:109), "age_110+"),
with = FALSE
])
rm(list = "rhos") # cleanup
Give information about how long each time step is, by specifying the age bounds
rate_matrix_t_min
andrate_matrix_t_max
over which the intensity matrix applies;Optionally, if we want to sample times in a sub-interval of
(rate_matrix_t_min, rate_matrix_t_max]
, we can specify even narrower bounds,t_min
andt_max
. If you omitt_min
ort_max
, the software usesrate_matrix_t_min
orrate_matrix_t_max
, respectively, to specify the sampling interval.Because no person lives beyond the maximum simulation age of 110 years, we need to force the simulation of at least one death event over the simulation interval. This means that we are sampling from a zero-truncated NHPPP. Setting the option
atleast1
toTRUE
achieves this.We only need to sample the earliest event from this NHPPP. So we set the
atmost1
option toTRUE
.
pop[
,
age_dead_from_other_causes :=
nhppp::vdraw_sc_step_regular(
lambda_matrix = rho_matrix,
rate_matrix_t_min = 0,
rate_matrix_t_max = 110,
t_min = pop$spawn_age, # 40
t_max = pop$max_simulation_age, # 110
atmost1 = TRUE,
atleast1 = TRUE
)
]
Environmental toxin exposure histories
We will generate environmental exposure histories with a phenomenological model. We will assume that
People may be exposed to the environmental toxin with probability .
For those who will be exposed, the start age of exposure is , provided that they are still alive.
Among those who are exposed, the probability that their exposure will eventually stop is .
In the pertinent subgroup of persons, the duration of the exposure is , if they are still alive.
For people with at least some exposure to the toxin, for all times in the exposure window the exposure levels are , where is a person’s age and the amplitude (maximum exposure) has model . Otherwise, .
We now add the per-person parameters for exposure histories in the
population data.table. For people who will never be exposed we set
to zero, and their exposure start and stop ages at the
max_simuation_age
. This avoids if ... else
statements, and is still pretty fast. If you run a massive model,
though, you may want to be smarter about it.
pop[, `:=`(
exposure_start_age = max_simulation_age,
exposure_stop_age = max_simulation_age,
maximum_exposure = 0
)][
,
will_start_exposure := runif(.N) < 0.20
][
will_start_exposure == TRUE,
will_stop_exposure := runif(.N) < 0.60
][
will_start_exposure == TRUE,
exposure_start_age := pmin(runif(.N, 12, 35), age_dead_from_other_causes)
][
will_stop_exposure == TRUE,
exposure_stop_age := pmin(
exposure_start_age + runif(.N, 1, 35),
age_dead_from_other_causes
)
][
will_start_exposure == TRUE,
maximum_exposure := runif(.N, 1 / 5, 1)
]
# cleanup
pop[, will_start_exposure := NULL][, will_stop_exposure := NULL]
We implement
as a function that is vectorized over all its arguments. The arguments
start_age
, stop_age
, max_exposure
correspond to the variables
in the equation above.
Emergence of pre-clinical cancer in unexposed and exposed intervals
Assume that the intensity function for cancer emergence in the absence of toxin exposure is
,
where is age in years.
This intensity function generates a Weibull point process (a special case of an NHPPP). The parameters and are assumed to vary across people according to the models and , where and stand for uniform and normal distributions. We sample these values for each person in the population.
pop[, `:=`(
param_cancer_emergence_shape = runif(.N, 7, 9),
param_cancer_emergence_scale = rnorm(.N, 150, 20)
)]
Generating a Weibull point process is easy in R
using
the stats::rweibull()
function. (This would take care of
the cancer emergence times for people without toxin exposure, but not
for people with toxin exposures.) Accounting for toxin exposure
histories, the intensity function for cancer emergence is
.
We will assume that the toxin exposure effect is distributed as , where is a slab and smear normal distribution.
We need to sample from an NHPPP with an intensity function that
varies over time as per
.
We will use nhppp
’s vdraw_intensity()
function, which needs
The intensity function (argument
lambda
) in a vectorized form, so that age is the only needed argument and all other arguments are set by default.A majorizer piecewise constant function, which will be specified as a matrix
lambda_maj_matrix
.The
rate_matrix_t_min
,rate_matrix_t_max
arguments that specify the time bounds for the matrixlambda_maj_matrix
.t_min
, andt_max
arguments, for the subinterval over whchi we will sample times. Here,t_min = 40
– the spawn age in the simulation, andt_max
is theage_dead_from_other_causes
.
Let’s implement the above.
The intensity function is specified as follows. Observe that it is in vectorized form.
lambda <- function(t, P = pop, ...) {
# non-risk factor part: shape / scale * (t/scale)^(shape - 1)
(P$param_cancer_emergence_shape / P$param_cancer_emergence_scale) *
(t / P$param_cancer_emergence_scale)^(P$param_cancer_emergence_shape - 1) +
# risk factor (toxin exposure) part: delta_k * xi(t)
P$param_toxin_exposure_diff *
xi(
t = t,
max_exposure = P$maximum_exposure,
start_age = P$exposure_start_age,
stop_age = P$exposure_stop_age
)
}
We also need a piecewise constant majorizer function . We say that majorizes if for all of interest. The function expects a regular step majorizer function. We will create such a function with equally-spaced intervals over the whole simulation window. First, generate the endpoints of the intervals. This will be a matrix where the rows correspond to persons and the columns to the interval bounds.
# define interval bounds for the step function, one row per person
M <- 10
time_breaks <- matrix(
data = rep(x = seq(from = 40, to = 110, length.out = M + 1), each = K),
byrow = FALSE,
nrow = K
)
time_breaks[1:3, ]
#> [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11]
#> [1,] 40 47 54 61 68 75 82 89 96 103 110
#> [2,] 40 47 54 61 68 75 82 89 96 103 110
#> [3,] 40 47 54 61 68 75 82 89 96 103 110
… and now generate the majorizer matrix using nhppp
’s
get_step_majorizer()
function. (The paper in the
Bibliography explains how this function works.)
lambda_star <- nhppp::get_step_majorizer(
fun = lambda,
breaks = time_breaks,
is_monotone = FALSE,
K = 1.9 / 4 # This is the maximum slope of xi() -- which you get with some calculus
)
lambda_star[1:3, ]
#> [,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8]
#> [1,] 1.664784 1.664424 1.664424 1.664554 1.665456 1.665944 1.667683 1.669700
#> [2,] 1.662535 1.662590 1.662706 1.662929 1.663331 1.664018 1.665139 1.666900
#> [3,] 1.662512 1.662533 1.662580 1.662677 1.662861 1.663191 1.663756 1.664682
#> [,9] [,10]
#> [1,] 1.672383 1.677464
#> [2,] 1.669577 1.673531
#> [3,] 1.666145 1.668387
And now, we can sample the cancer generation times, and create a variable to identify patients with cancer.
pop[
,
age_cancer_emergence := nhppp::vdraw_intensity(
lambda = lambda,
lambda_maj_matrix = lambda_star,
rate_matrix_t_min = 40,
rate_matrix_t_max = 110,
t_min = pop$spawn_age,
t_max = pmin(pop$age_dead_from_other_causes, 110, na.rm = TRUE),
atmost1 = TRUE
)
][
,
with_cancer := !is.na(age_cancer_emergence),
]
Dying from cancer
People with preclinical cancer may die from cancer causes. We will assume that the intensity from cancer deaths is loglinear in time, that is
,
with parameters and .
pop[, param_cancer_death_intercept := rnorm(.N, -3, 0.2)]
pop[, param_cancer_death_slope := runif(.N, 0, 0.003)]
We could use the vdraw_intensity()
function again, since
we already know the intensity
and we can easily create a majorizer function for it, as we did when we
generated cancer emergence times. This would be plenty fast for our
small simulation with
and requires no additional mathematics.
We can sample even faster if we can analytically obtain the
cumulative intensity function
,
and its inverse
.
(The inverse function recovers
from the value of
:
).
This sampling is done with nhppp
’s
vdraw_cumulative_intensity()
function.
A bit of calculus can yield , which we can implement in vectorized form and with default parameters already set:
Nu <- function(t, Lambda_args = list(population), ...) {
P <- Lambda_args$population
(
exp(P$param_cancer_death_intercept + P$param_cancer_death_slope * t) -
exp(P$param_cancer_death_intercept)
) / P$param_cancer_death_slope
}
The inverse is
$N_k^{-1}(z) = ( ( _k z + e^_k ) - _k )/_k $
Nu_inv <- function(z, Lambda_inv_args = list(population), ...) {
P <- Lambda_inv_args$population
(
log(P$param_cancer_death_slope * z +
exp(P$param_cancer_death_intercept)) -
P$param_cancer_death_intercept
) / P$param_cancer_death_slope
}
Then, we can sample the times to cancer death.
args_list <- list(population = pop[!is.na(age_cancer_emergence), ])
pop[
!is.na(age_cancer_emergence),
age_dead_from_cancer_causes := nhppp::vdraw_cumulative_intensity(
Lambda = Nu,
Lambda_args = args_list,
Lambda_inv = Nu_inv,
Lambda_inv_args = args_list,
t_min = pop[!is.na(age_cancer_emergence), age_cancer_emergence],
t_max = pop[!is.na(age_cancer_emergence), age_dead_from_other_causes],
atmost1 = TRUE
)
]
rm(list = "args_list") # cleanup
Dying from all causes
The age of death from all causes is the minimum of the ages across both causes of death.
pop[
,
age_dead := pmin(age_dead_from_other_causes,
age_dead_from_cancer_causes,
na.rm = TRUE
)
]
Clinical cancer diagnosis
Cancers first emerge in a pre-clinical stage. Some will be diagnosed
as
clinical cancers with intensity function
.
We will assume that clinical diagnosis has constant rate which is
distributed according to the model
,
where indexes over people with cancer.
Constant rates result in exponential times, which we can easily
sample with the stats::rexp()
function, as per the
commented out code below.
### Using rexp()
tictoc::tic()
pop[
!is.na(age_cancer_emergence),
age_clinical_cancer_dx :=
age_cancer_emergence +
rexp(.N, rate = param_clinical_cancer_dx_rate)
]
pop[
age_clinical_cancer_dx >= age_dead,
age_clinical_cancer_dx := NA
]
tictoc::toc()
#> 0.004 sec elapsed
With nhppp
, we can use the
vdraw_sc_step_regular()
function that samples from
piecewise constant intensities. (A constant function over an interval is
still a piecewise constant function – with a single piece.) The
nhppp
implementation will be only a bit slower – but it is
worth showing.
tictoc::tic()
mu_mat <- as.matrix(pop[
!is.na(age_cancer_emergence),
param_clinical_cancer_dx_rate
])
pop[
!is.na(age_cancer_emergence),
age_clinical_cancer_dx := nhppp::vdraw_sc_step_regular(
lambda_matrix = mu_mat,
rate_matrix_t_min = pop[!is.na(age_cancer_emergence), age_cancer_emergence],
rate_matrix_t_max = pop[!is.na(age_cancer_emergence), age_dead],
atmost1 = TRUE
)
]
tictoc::toc()
#> 0.004 sec elapsed
Some descriptives
# pop$age_cancer_emergence |> summary()
summary(pop)
#> id birth_cohort spawn_age max_simulation_age
#> Min. : 1 Min. :2015 Min. :40 Min. :110
#> 1st Qu.: 25001 1st Qu.:2015 1st Qu.:40 1st Qu.:110
#> Median : 50000 Median :2015 Median :40 Median :110
#> Mean : 50000 Mean :2015 Mean :40 Mean :110
#> 3rd Qu.: 75000 3rd Qu.:2015 3rd Qu.:40 3rd Qu.:110
#> Max. :100000 Max. :2015 Max. :40 Max. :110
#>
#> sex age_dead_from_other_causes exposure_start_age
#> Length:100000 Min. : 40.01 Min. : 12.00
#> Class :character 1st Qu.: 72.82 1st Qu.:110.00
#> Mode :character Median : 82.57 Median :110.00
#> Mean : 80.20 Mean : 92.69
#> 3rd Qu.: 89.58 3rd Qu.:110.00
#> Max. :109.87 Max. :110.00
#>
#> exposure_stop_age maximum_exposure param_cancer_emergence_shape
#> Min. : 13.32 Min. :0.00 Min. :7.000
#> 1st Qu.:110.00 1st Qu.:0.00 1st Qu.:7.501
#> Median :110.00 Median :0.00 Median :8.002
#> Mean :101.76 Mean :0.12 Mean :8.001
#> 3rd Qu.:110.00 3rd Qu.:0.00 3rd Qu.:8.502
#> Max. :110.00 Max. :1.00 Max. :9.000
#>
#> param_cancer_emergence_scale param_toxin_exposure_diff age_cancer_emergence
#> Min. : 67.46 Min. :0.000000 Min. : 40.01
#> 1st Qu.:136.42 1st Qu.:0.006624 1st Qu.: 57.42
#> Median :149.99 Median :0.010004 Median : 72.15
#> Mean :149.94 Mean :0.010052 Mean : 70.12
#> 3rd Qu.:163.48 3rd Qu.:0.013392 3rd Qu.: 82.73
#> Max. :234.05 Max. :0.032101 Max. :107.68
#> NA's :95613
#> with_cancer param_cancer_death_intercept param_cancer_death_slope
#> Mode :logical Min. :-3.817 Min. :3.500e-09
#> FALSE:95613 1st Qu.:-3.134 1st Qu.:7.468e-04
#> TRUE :4387 Median :-3.000 Median :1.507e-03
#> Mean :-3.000 Mean :1.502e-03
#> 3rd Qu.:-2.866 3rd Qu.:2.257e-03
#> Max. :-2.140 Max. :3.000e-03
#>
#> age_dead_from_cancer_causes age_dead param_clinical_cancer_dx_rate
#> Min. : 40.20 Min. : 40.01 Min. :0.20
#> 1st Qu.: 61.91 1st Qu.: 72.35 1st Qu.:0.22
#> Median : 73.63 Median : 82.26 Median :0.24
#> Mean : 72.40 Mean : 79.87 Mean :0.24
#> 3rd Qu.: 83.16 3rd Qu.: 89.36 3rd Qu.:0.25
#> Max. :108.17 Max. :109.87 Max. :0.27
#> NA's :97768 NA's :95613
#> age_clinical_cancer_dx
#> Min. : 40.31
#> 1st Qu.: 58.56
#> Median : 72.68
#> Mean : 70.95
#> 3rd Qu.: 82.96
#> Max. :106.46
#> NA's :96980
Bibliography
Trikalinos TA, Sereda Y. nhppp: Simulating Nonhomogeneous Poisson Point Processes in R. arXiv preprint arXiv:2402.00358. 2024 Feb 1.
Since the publication of the paper, the syntax and options of the
nhppp
package have evolved. To reproduce the code in the
paper, you have to install the version of nhppp
used in the
paper. Alternatively, take a look at the vignettes, which are written to
work with the current package.