In this article we illustrate how to fit cause specific hazards models to competing risks data. The standard way to estimate cause specific hazards is to create one data set for each event type and fit a separate model. However, it is also possible to create one combined data set and enter the event type as a covariate (with interactions), such that it is possible to estimate shared effects (i.e., effects that contribute equally to the hazard of multiple event types).

fourD Data

For illustration we use the fourD data set from the etm package. The data set contains time-constant covariates like age and sex as well as time-to-event (time) and event type indicator status (0 = censored, 1 = death from cardiovascular events, 2 = death from other causes).

library(survival)
library(pammtools)
library(purrr)
data("fourD", package = "etm")
head(fourD)
##      id    sex age medication status      time treated
## 1  5002   Male  60    Placebo      0 5.8480493       0
## 4  5006 Female  68    Placebo      0 5.2539357       0
## 7  5011 Female  70    Placebo      1 2.9541410       0
## 9  5014   Male  69    Placebo      1 0.9856263       0
## 10 5017 Female  58    Placebo      1 0.2902122       0
## 11 5018   Male  63    Placebo      1 3.9452430       0

Data transformation

The data transformation required to fit PAMMs to competing risks data is similar to the transformation in the single event case (see the data transformation vignette for details). In fact, internally the standard transformation is applied to each event type using as_ped, however, some choices have to be made

  • use the same or different interval split points for the different event types?
  • return the data as a list (one element for each event type) or a stacked data set (with an additional column (covariate), indicating the event type)

For cause specific hazards without shared effects the combination of cause specific interval split points and list output is usually sufficient. For models with shared effects we need to stack the individual data sets and use split points common for all event types.

Cause specific hazards model without shared effects

Below we transform the data set for the case without shared effects. By specifying cobmine = FALSE, the individual data sets are not stacked but rather returned in a list.

cut <- sample(fourD$time, 100)
ped <- fourD %>%
  select(-medication, - treated) %>%
  as_ped(Surv(time, status)~., id = "id", cut = cut, combine = FALSE)
str(ped, 1)
## List of 2
##  $ cause = 1:Classes 'ped' and 'data.frame': 30891 obs. of  9 variables:
##   ..- attr(*, "breaks")= num [1:96] 0.0684 0.2081 0.2218 0.3094 0.3231 ...
##   ..- attr(*, "id_var")= chr "id"
##   ..- attr(*, "intvars")= chr [1:6] "id" "tstart" "tend" "interval" ...
##   ..- attr(*, "trafo_args")=List of 3
##   ..- attr(*, "time_var")= chr "time"
##   ..- attr(*, "status_var")= chr "status"
##  $ cause = 2:Classes 'ped' and 'data.frame': 30891 obs. of  9 variables:
##   ..- attr(*, "breaks")= num [1:96] 0.0684 0.2081 0.2218 0.3094 0.3231 ...
##   ..- attr(*, "id_var")= chr "id"
##   ..- attr(*, "intvars")= chr [1:6] "id" "tstart" "tend" "interval" ...
##   ..- attr(*, "trafo_args")=List of 3
##   ..- attr(*, "time_var")= chr "time"
##   ..- attr(*, "status_var")= chr "status"
##  - attr(*, "class")= chr [1:4] "ped_cr_list" "ped_cr" "ped" "list"
##  - attr(*, "trafo_args")=List of 5
##  - attr(*, "risks")= int [1:2] 1 2
# data set for event type 1 (death from cardiovascular events)
head(ped[[1]])
##     id     tstart       tend                    interval    offset ped_status
## 1 5002 0.00000000 0.06844627            (0,0.0684462697] -2.681706          0
## 2 5002 0.06844627 0.20807666 (0.0684462697,0.2080766598] -1.968756          0
## 3 5002 0.20807666 0.22176591 (0.2080766598,0.2217659138] -4.291144          0
## 4 5002 0.22176591 0.30937714 (0.2217659138,0.3093771389] -2.434846          0
## 5 5002 0.30937714 0.32306639 (0.3093771389,0.3230663929] -4.291144          0
## 6 5002 0.32306639 0.44626968 (0.3230663929,0.4462696783] -2.093920          0
##    sex age cause
## 1 Male  60     1
## 2 Male  60     1
## 3 Male  60     1
## 4 Male  60     1
## 5 Male  60     1
## 6 Male  60     1
# data set for event type 2 (death from other causes)
head(ped[[2]])
##     id     tstart       tend                    interval    offset ped_status
## 1 5002 0.00000000 0.06844627            (0,0.0684462697] -2.681706          0
## 2 5002 0.06844627 0.20807666 (0.0684462697,0.2080766598] -1.968756          0
## 3 5002 0.20807666 0.22176591 (0.2080766598,0.2217659138] -4.291144          0
## 4 5002 0.22176591 0.30937714 (0.2217659138,0.3093771389] -2.434846          0
## 5 5002 0.30937714 0.32306639 (0.3093771389,0.3230663929] -4.291144          0
## 6 5002 0.32306639 0.44626968 (0.3230663929,0.4462696783] -2.093920          0
##    sex age cause
## 1 Male  60     2
## 2 Male  60     2
## 3 Male  60     2
## 4 Male  60     2
## 5 Male  60     2
## 6 Male  60     2

To fit the model, we could loop through the list entries and fit the model of interest, however, there is also a convenience function, that recognizes the data type and fits the models accordingly:

library(mgcv)
pam_csh <- map(ped, ~ pamm(ped_status ~ s(tend) + sex + age, data = .x))
map(pam_csh, summary)
## $`cause = 1`
## 
## Family: poisson 
## Link function: log 
## 
## Formula:
## ped_status ~ s(tend) + sex + age
## 
## Parametric coefficients:
##              Estimate Std. Error z value Pr(>|z|)    
## (Intercept) -3.167236   0.583971  -5.424 5.84e-08 ***
## sexMale     -0.130885   0.132003  -0.992   0.3214    
## age          0.019828   0.008447   2.347   0.0189 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Approximate significance of smooth terms:
##           edf Ref.df Chi.sq p-value   
## s(tend) 1.009  1.018  8.233 0.00428 **
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## R-sq.(adj) =  -0.00847   Deviance explained = 0.56%
## UBRE = -0.91401  Scale est. = 1         n = 30891
## 
## $`cause = 2`
## 
## Family: poisson 
## Link function: log 
## 
## Formula:
## ped_status ~ s(tend) + sex + age
## 
## Parametric coefficients:
##             Estimate Std. Error z value Pr(>|z|)    
## (Intercept) -6.97569    0.88326  -7.898 2.84e-15 ***
## sexMale      0.16815    0.18028   0.933    0.351    
## age          0.06426    0.01244   5.166 2.39e-07 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Approximate significance of smooth terms:
##           edf Ref.df Chi.sq p-value   
## s(tend) 1.015  1.029  10.45 0.00129 **
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## R-sq.(adj) =  -0.00104   Deviance explained =  2.4%
## UBRE = -0.95238  Scale est. = 1         n = 30891

Cause specific hazards with shared effects

The data transformation is performed as before, but setting combine=TRUE (the default), the interval cut points are created based on all event times (event times of all event types, here) and stacked:

ped_stacked <- fourD %>%
  select(-medication, - treated) %>%
  as_ped(Surv(time, status)~., id = "id", cut = cut) %>%
  mutate(cause = as.factor(cause))
head(ped_stacked)
##     id     tstart       tend                    interval    offset ped_status
## 1 5002 0.00000000 0.06844627            (0,0.0684462697] -2.681706          0
## 2 5002 0.06844627 0.20807666 (0.0684462697,0.2080766598] -1.968756          0
## 3 5002 0.20807666 0.22176591 (0.2080766598,0.2217659138] -4.291144          0
## 4 5002 0.22176591 0.30937714 (0.2217659138,0.3093771389] -2.434846          0
## 5 5002 0.30937714 0.32306639 (0.3093771389,0.3230663929] -4.291144          0
## 6 5002 0.32306639 0.44626968 (0.3230663929,0.4462696783] -2.093920          0
##    sex age cause
## 1 Male  60     1
## 2 Male  60     1
## 3 Male  60     1
## 4 Male  60     1
## 5 Male  60     1
## 6 Male  60     1

Model for cause specific hazards with shared effects is performed by inclusion of interaction effects:

pam_csh_shared <- pamm(
  formula = ped_status ~ s(tend, by = cause) + sex + sex:cause + age + age:cause,
  data = ped_stacked)
summary(pam_csh_shared)
## 
## Family: poisson 
## Link function: log 
## 
## Formula:
## ped_status ~ s(tend, by = cause) + sex + sex:cause + age + age:cause
## 
## Parametric coefficients:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)      -3.167236   0.583971  -5.424 5.84e-08 ***
## sexMale          -0.130885   0.132003  -0.992 0.321424    
## age               0.019828   0.008447   2.347 0.018906 *  
## sexFemale:cause2 -3.808003   1.058828  -3.596 0.000323 ***
## sexMale:cause2   -3.509017   1.012453  -3.466 0.000529 ***
## age:cause2        0.044429   0.015035   2.955 0.003126 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Approximate significance of smooth terms:
##                  edf Ref.df Chi.sq p-value   
## s(tend):cause1 1.009  1.018  8.233 0.00428 **
## s(tend):cause2 1.041  1.081 10.323 0.00151 **
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## R-sq.(adj) =  -0.00533   Deviance explained = 2.06%
## UBRE = -0.93319  Scale est. = 1         n = 61782

The results indicate that cause specific terms (interactions) are necessary in this case and the two models largely agree. For example, the age effect for the two causes are very similar for both models:

  • cause1: 0.02 (pamm_csh1) vs. 0.02 (pamm_csh_shared)
  • cause2: 0.064 (pamm_csh2) vs. 0.02 + 0.044= 0.064 (pamm_csh_shared)

Cumulative Incidence Function (CIF)

Finally, in many cases we will want to calculate and visualize the cumulative incidence functions for different covariate combinations. In pammtools this can be again achieved using make_newdata and using the appropriate add_* function, here add_cif:

ndf <- ped_stacked %>%
  make_newdata(tend = unique(tend), cause = unique(cause)) %>%
  group_by(cause) %>%
  add_cif(pam_csh_shared)
ndf %>%
  select(tend, cause, cif, cif_lower, cif_upper) %>%
  group_by(cause) %>%
  slice(1:3)
## # A tibble: 6 × 5
## # Groups:   cause [2]
##     tend cause     cif cif_lower cif_upper
##    <dbl> <fct>   <dbl>     <dbl>     <dbl>
## 1 0.0684 1     0.00728   0.00570   0.00926
## 2 0.208  1     0.0221    0.0175    0.0278 
## 3 0.222  1     0.0235    0.0186    0.0296 
## 4 0.0684 2     0.00351   0.00244   0.00477
## 5 0.208  2     0.0107    0.00754   0.0144 
## 6 0.222  2     0.0114    0.00804   0.0154
ggplot(ndf, aes(x = tend, y = cif)) +
  geom_line(aes(col = cause)) +
  geom_ribbon(
    aes(ymin = cif_lower, ymax = cif_upper, fill = cause),
    alpha = .3)

Similar to other applications of add_* functions, we can additionally group by other covariate values:

ndf <- ped_stacked %>%
  make_newdata(tend = unique(tend), cause = unique(cause), sex = unique(sex))
ndf <- ndf %>%
  group_by(cause, sex) %>%
  add_cif(pam_csh_shared)

The estimated CIFs can then be compared w.r.t. to cause for each category of sex:

ggplot(ndf, aes(x = tend, y = cif)) +
  geom_line(aes(col = cause)) +
  geom_ribbon(
    aes(ymin = cif_lower, ymax = cif_upper, fill = cause),
    alpha = .3) +
  facet_wrap(~sex, labeller = label_both)

or w.r.t. to sex for each cause:

ggplot(ndf, aes(x = tend, y = cif)) +
  geom_line(aes(col = sex)) +
  geom_ribbon(
    aes(ymin = cif_lower, ymax = cif_upper, fill = sex),
    alpha = .3) +
  facet_wrap(~cause, labeller = label_both)