R/alloc.def3.R

Defines functions alloc.def3

Documented in alloc.def3

#’ Allocate sample size across regions by Definition 3 using asymptotic
#' distributions derived.
#‘
#‘ @description This function uses grid research to achieve optimal sample
#' size allocation across regions by maximizing conditional assurance probability by
#' Definition 3 when regional treatment effects are sightly different.
#'
#' @param r0 True overall log hazard ratio
#' @param alpha The risk of rejecting the null hypothesis H0:r0>=0
#' when it is really true
#' @param beta The risk of failing to reject the null
#' hypothesis H0:r0>=0 when it is really false
#' @param s Number of regions participating in the MRCT
#' @param u A vector presents ratios of true regional log
#' hazard ratios to true overall log hazard ratio r=u*r0
#' @param eps Significance level of not rejecting H0 in Definition 3
#' @param pai The preserved proportion of overall treatment effect
#' @param grid Grid interval of the grid research
#'
#' @return A list
#' @export
#'
#' @examples
#' set.seed(123)
#' Alloc3 <- alloc.def3(r0=log(0.7), alpha=0.05, beta=0.2, s=3, u=c(1.1,1,0.9), eps=0.3,
#' pai=1/3, grid=0.1)
#'
alloc.def3 <- function(r0, alpha=0.05, beta=0.2, s, u, eps, pai, grid=0.1){
    if(sum(u==rep(1,s))==s) stop("Regional treatment effects should be slightly differenct.")
    t1 <- Sys.time()
    E0 = Eventnum(r0, alpha, beta)
    num = seq(grid,1-grid*(s-1),grid)
    y = t(combn(rep(num,s),s))
    y = unique(y)
    y = as.data.frame(y)
    y$sum = apply(y,1,sum)
    all_comb <- y[y$sum==1,1:s]
    colnames(all_comb) <- paste0("f",1:s)
    all_comb$con.AP <- rep(NA,nrow(all_comb))
    
    for(i in 1:nrow(all_comb)){
        f = as.numeric(all_comb[i,1:s])
        all_comb$con.AP[i] = prob.def3(r0=r0, s=s, E0=E0, u=u, f=f, eps, pai, alpha)$prob.cn
    }
    final_comb <- all_comb[order(-all_comb$con.AP),]
    final_comb$rank <- rank(-final_comb$con.AP)
    rownames(final_comb) <- NULL
    f <- as.numeric(final_comb[1,1:s])
    t2 <- Sys.time()
    Alloc_list <- list(optimal_alloc=f,alloc_cn.AP=final_comb,duration=t2-t1)
    return(Alloc_list)
}
carolinewei/apsurvival documentation built on Nov. 4, 2019, 8:44 a.m.