library(survival)
### load data
nwts <- nwtsco[1:100,]
### create strata based on institutional histology and disease status
nwts$strt <- 1+nwts$instit
### add a stratum containing all (relapsed) cases
nwts$strt[nwts$relaps==1] <- 3
### assign phase II subsampling probabilities
### oversample unfavorable histology (instit =1) and cases
### Pi = 0.5 for instit =0, Pi =1 for instit =1 and relaps =1
nwts$Pi<- 0.5 * (nwts$strt == 1) + 1 * (nwts$strt == 2) + 1 * (nwts$strt == 3)
### generate phase II sampling indicators
N <- dim(nwts)[1]
nwts$in.ph2 <- rbinom(N, 1, nwts$Pi)
### fit an additive hazards model to two-phase sampling data without calibration
fit1 <- ah.2ph(Surv(trel,relaps) ~ age + histol, data = nwts, R = in.ph2, Pi = Pi,
robust = FALSE, calibration.variables = NULL)
summary(fit1)
### fit an additve hazards model with calibration on age
fit2 <- ah.2ph(Surv(trel,relaps) ~ age + histol, data = nwts, R = in.ph2, Pi = Pi,
robust = FALSE, calibration.variables = age)
summary(fit2)
### calibrate on age square
### note if users create a calibration variable, then
### the new variable should be added to the original data frame
nwts$age2 <- nwts$age^2
fit3 <- ah.2ph(Surv(trel,relaps) ~ age + histol, data = nwts, R = in.ph2, Pi = Pi,
robust = FALSE, calibration.variables = age2)
summary(fit3)
Run the code above in your browser using DataLab