nph: report for conditional power - R code

knitr::opts_chunk(echo = TRUE, eval = FALSE)
# Output results --------------------------------------------------------
intplot = params$intplot
dat = params$dat
K5  = params$K5
B5  = params$B5
cp_pow = params$cp_pow
head(dat)
intplot(dat, K5, B5, main = "Interim data")

# Output results --------------------------------------------------------
p_results <- 
  data.frame(
    Test  = c("Maximum Logrank", rep("Weighted Logrank", 4)),
    rho   = c("0011", 0, 0, 1, 1),
    gamma = c("0101", 0, 1, 0, 1),
    power = cp_pow) 

p_results
# Output results --------------------------------------------------------
knitr::kable(p_results)


Try the nph package in your browser

Any scripts or data that you put into this service are public.

nph documentation built on May 17, 2022, 1:06 a.m.