The R Bayesian evidence synthesis Tools (RBesT) facilitate the use of historical information in clinical trials. Once relevant historical information has been identified, RBesT supports the derivation of informative priors via the Meta-Analytic-Predictive (MAP) approach [1] and the evaluation of the trial’s operating characteristics. The MAP approach performs a standard meta-analysis followed by a prediction for the control group parameter of a future study while accounting for the uncertainty in the population mean (the standard result from a meta-analysis) and the between-trial heterogeneity. Therefore, RBesT can also be used as a meta-analysis tool if one simply neglects the prediction part.
This document demonstrates RBesT as it can be used to derive from historical control data a prior for a binary endpoint. The RBesT package homepage contains further articles on introductory material:
Let’s consider a Novartis Phase II study in ankylosing spondylitis comparing the Novartis test treatment secukinumab with placebo [2]. The primary efficacy endpoint was percentage of patients with a 20% response according to the Assessment of SpondyloArthritis international Society criteria for improvement (ASAS20) at week 6. For the control group, the following historical data were used to derive the MAP prior:
study | n | r |
---|---|---|
Study 1 | 107 | 23 |
Study 2 | 44 | 12 |
Study 3 | 51 | 19 |
Study 4 | 39 | 9 |
Study 5 | 139 | 39 |
Study 6 | 20 | 6 |
Study 7 | 78 | 9 |
Study 8 | 35 | 10 |
This dataset is part of RBesT and available after loading the package
in the data frame AS
.
RBesT supports all required steps to design a clinical trial with historical information using the MAP approach.
The gMAP
function performs the
meta-analysis and the prediction, which yields the MAP prior. The
analysis is run using stochastic Markov-Chain-Monte-Carlo with Stan. In
order to make results exactly reproducible, the set.seed
function must be called prior to calling
gMAP
.
A key parameter in a meta-analysis is the between-trial heterogeneity
parameter \(\tau\) which controls the
amount of borrowing from historical information for the estimation of
the population mean will occur. As we often have only few historical
trials, the prior is important. For binary endpoints with an expected
response rate of 20%-80% we recommend a conservative
HalfNormal(0,1)
prior as a default. Please refer to the
help-page of gMAP
for more
information.
The gMAP
function returns an analysis
object from which we can extract information using the functions from
RBesT. We do recommend to look at the graphical model checks provided by
RBesT as demonstrated below. The most important one is the forest plot,
with solid lines for the MAP model predictions and dashed lines for the
stratified estimates. For a standard forest plot without the shrinkage
estimates please refer to the forest_plot
function in
RBesT.
# load R packages
library(RBesT)
library(ggplot2)
theme_set(theme_bw()) # sets up plotting theme
set.seed(34563)
<- gMAP(cbind(r, n-r) ~ 1 | study,
map_mcmc data=AS,
tau.dist="HalfNormal",
tau.prior=1,
beta.prior=2,
family=binomial)
## Assuming default prior location for beta: 0
print(map_mcmc)
## Generalized Meta Analytic Predictive Prior Analysis
##
## Call: gMAP(formula = cbind(r, n - r) ~ 1 | study, family = binomial,
## data = AS, tau.dist = "HalfNormal", tau.prior = 1, beta.prior = 2)
##
## Exchangeability tau strata: 1
## Prediction tau stratum : 1
## Maximal Rhat : 1
##
## Between-trial heterogeneity of tau prediction stratum
## mean sd 2.5% 50% 97.5%
## 0.3770 0.2170 0.0414 0.3460 0.8930
##
## MAP Prior MCMC sample
## mean sd 2.5% 50% 97.5%
## 0.2580 0.0842 0.1120 0.2510 0.4590
## a graphical representation of model checks is available
<- plot(map_mcmc)
pl
## a number of plots are immediately defined
names(pl)
## [1] "densityThetaStar" "densityThetaStarLink" "forest_model"
## forest plot with model estimates
print(pl$forest_model)
An often raised concern with a Bayesian analysis is the choice of the
prior. Hence sensitivity analyses may sometimes be necessary. They can
be quickly performed with the update
function. Suppose we want to evaluate a more optimistic scenario (with
less between-trial heterogeneity), expressed by a
HalfNormal(0,1/2)
prior on \(\tau\). Then we can rerun the original
analysis, but with modified arguments of
gMAP
:
set.seed(36546)
<- update(map_mcmc, tau.prior=1/2) map_mcmc_sens
## Assuming default prior location for beta: 0
print(map_mcmc_sens)
## Generalized Meta Analytic Predictive Prior Analysis
##
## Call: gMAP(formula = cbind(r, n - r) ~ 1 | study, family = binomial,
## data = AS, tau.dist = "HalfNormal", tau.prior = 1/2, beta.prior = 2)
##
## Exchangeability tau strata: 1
## Prediction tau stratum : 1
## Maximal Rhat : 1
##
## Between-trial heterogeneity of tau prediction stratum
## mean sd 2.5% 50% 97.5%
## 0.3340 0.1770 0.0362 0.3120 0.7280
##
## MAP Prior MCMC sample
## mean sd 2.5% 50% 97.5%
## 0.2580 0.0802 0.1230 0.2480 0.4430
As a next step, the MAP prior, represented numerically using a large
MCMC simulation sample, is converted to a parametric representation with
the automixfit
function. This function
fits a parametric mixture representation using expectation-maximization
(EM). The number of mixture components to best describe the MAP is
chosen automatically. Again, the plot
function produces a
graphical diagnostic which allows the user to assess whether the
marginal mixture density (shown in black) matches well with the
histogram of the MAP MCMC sample.
<- automixfit(map_mcmc)
map print(map)
## EM for Beta Mixture Model
## Log-Likelihood = 4523.865
##
## Univariate beta mixture
## Mixture Components:
## comp1 comp2
## w 0.6167463 0.3832537
## a 19.1916387 3.5278745
## b 57.7779318 9.3735980
plot(map)$mix
The (usual) intended use of a (MAP) prior is to reduce the number of
control patients in the trial. The prior can be considered equivalent to
a number of experimental observations, which is called the effective
sample size (ESS) of the prior. It can be calculated in RBesT with the
ess
function. It should be noted, however,
that the concept of ESS is somewhat elusive. In particular, the
definition of the ESS is not unique and multiple methods have therefore
been implemented in RBesT. The default method in RBesT is the elir
approach [5] which results in reasonable ESS estimates. The moment
matching approach leads to conservative (small) ESS estimates while the
Morita [3] method tends to estimates liberal (large) ESS estimates when
used with mixtures:
round(ess(map, method="elir")) ## default method
## [1] 37
round(ess(map, method="moment"))
## [1] 26
round(ess(map, method="morita"))
## [1] 63
The Morita approach uses the curvature of the prior at the mode and has been found to be sensitive to a large number of mixture components. From experience, a realistic ESS estimate can be obtained with the elir method which is the only method which is predictively consistent, see [5] for details.
Finally, we recommend to robustify
[4]
the prior which protects against type-I error inflation in presence of
prior-data conflict, i.e. if the future trial data strongly deviate from
the historical control information.
## add a 20% non-informative mixture component
<- robustify(map, weight=0.2, mean=1/2)
map_robust print(map_robust)
## Univariate beta mixture
## Mixture Components:
## comp1 comp2 robust
## w 0.493397 0.306603 0.200000
## a 19.191639 3.527875 1.000000
## b 57.777932 9.373598 1.000000
round(ess(map_robust))
## [1] 26
Adding a robust mixture component does reduce the ESS of the MAP prior to an extent which depends on the weight of the robust component. Selecting higher robust mixture weights leads to greater discounting of the informative MAP prior and vice versa. As a consequence the robust weight controls the degree of influence of the MAP prior within the final analysis. In some circumstances it can be helpful to graphically illustrate the relationship of the prior ESS as a function of the robust mixture component weight:
<- data.frame(weight=seq(0.05, 0.95, by=0.05), ess=NA)
ess_weight for(i in seq_along(ess_weight$weight)) {
$ess[i] <- ess(robustify(map, ess_weight$weight[i], 0.5))
ess_weight
}<- rbind(ess_weight,
ess_weight data.frame(weight=c(0, 1),
ess=c(ess(map), ess(mixbeta(c(1,1,1))))))
qplot(weight, ess, data=ess_weight, geom=c("point", "line"),
main="ESS of robust MAP for varying weight of robust component") +
scale_x_continuous(breaks=seq(0, 1, by=0.1)) +
scale_y_continuous(breaks=seq(0, 40, by=5))
## Warning: `qplot()` was deprecated in ggplot2 3.4.0.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
Now we have a prior which can be specified in the protocol. The advantage of using historical information is the possible reduction of the placebo patient group. The sample size of the control group is supplemented by the historical information. The reduction in placebo patients can be about as large as the ESS of the MAP prior.
In the following, we compare designs with different sample sizes and priors for the control group. The comparisons are carried out by evaluating standard Frequentist operating characteristics (type-I error, power). The scenarios are not exhaustive, but rather specific ones to demonstrate the use of RBesT for design evaluation.
We consider the 2-arm design of the actual Novartis trial in ankylosing spondylitis [2]. This trial tested 6 patients on placebo as control against 24 patients on an active experimental treatment. Success was declared whenever the condition
\[\Pr(\theta_{active} - \theta_{control} > 0) > 0.95\]
was met for the response rates \(\theta_{active}\) and \(\theta_{control}\). A MAP prior was used for the placebo response rate parameter. Here we evaluate a few design options as an example.
The operating characteristics are setup in RBesT in a stepwise manner:
decision2S
function.oc2S
function. This includes the overall
decision function and per arm the prior and the sample size to use.Note that for a 1-sample situation the respective
decision1S
and oc1S
function are used
instead.
The type I can be increased compared to the nominal \(\alpha\) level in case of a conflict between the trial data and the prior. Note, that in this example the MAP prior has a 95% interval of about 0.1 to 0.5.
<- seq(0.1,0.95,by=0.01)
theta <- mixbeta(c(1,1,1))
uniform_prior <- mixbeta(c(1,0.5,1)) # prior for treatment used in trial
treat_prior <- mixbeta(c(1,11,32)) # prior for control used in trial
lancet_prior <- decision2S(0.95, 0, lower.tail=FALSE)
decision
<- oc2S(uniform_prior, uniform_prior, 24, 6, decision)
design_uniform <- oc2S(uniform_prior, uniform_prior, 24, 24, decision)
design_classic <- oc2S(treat_prior, map , 24, 6, decision)
design_nonrobust <- oc2S(treat_prior, map_robust , 24, 6, decision)
design_robust
<- design_uniform( theta, theta)
typeI_uniform <- design_classic( theta, theta)
typeI_classic <- design_nonrobust(theta, theta)
typeI_nonrobust <- design_robust( theta, theta)
typeI_robust
<- rbind(data.frame(theta=theta, typeI=typeI_robust, prior="robust"),
ocI data.frame(theta=theta, typeI=typeI_nonrobust, prior="non-robust"),
data.frame(theta=theta, typeI=typeI_uniform, prior="uniform"),
data.frame(theta=theta, typeI=typeI_classic, prior="uniform 24:24")
)
qplot(theta, typeI, data=ocI, colour=prior, geom="line", main="Type I Error")
Note that observing response rates greater that 50% is highly implausible based on the MAP analysis:
summary(map)
## mean sd 2.5% 50.0% 97.5%
## 0.25857963 0.08423297 0.10808237 0.25003652 0.47028444
Hence, it is resonable to restrict the response rates \(\theta\) for which we evaluate the type I error to a a range of plausible values:
qplot(theta, typeI, data=subset(ocI, theta < 0.5), colour=prior, geom="line",
main="Type I Error - response rate restricted to plausible range")
The power demonstrates the gain of using an informative prior; i.e. 80% power is reached for smaller \(\delta\) values in comparison to a design with non-informative priors for both arms.
<- seq(0,0.7,by=0.01)
delta <- summary(map)["mean"]
mean_control <- mean_control + delta
theta_active <- mean_control + 0*delta
theta_control
<- design_uniform( theta_active, theta_control)
power_uniform <- design_classic( theta_active, theta_control)
power_classic <- design_nonrobust(theta_active, theta_control)
power_nonrobust <- design_robust( theta_active, theta_control)
power_robust
<- rbind(data.frame(theta_active, theta_control, delta=delta, power=power_robust, prior="robust"),
ocP data.frame(theta_active, theta_control, delta=delta, power=power_nonrobust, prior="non-robust"),
data.frame(theta_active, theta_control, delta=delta, power=power_uniform, prior="uniform"),
data.frame(theta_active, theta_control, delta=delta, power=power_classic, prior="uniform 24:24")
)
qplot(delta, power, data=ocP, colour=prior, geom="line", main="Power")
We see that with the MAP prior one reaches greater power at smaller differences \(\delta\) in the response rate. For example, the \(\delta\) for which 80% power is reached can be found with:
<- function(design, theta_control, target_power) {
find_delta uniroot(function(delta) { design(theta_control + delta, theta_control) - target_power },
interval=c(0, 1-theta_control))$root
}
<- data.frame(delta=c(find_delta(design_nonrobust, mean_control, 0.8),
target_effect find_delta(design_classic, mean_control, 0.8),
find_delta(design_robust, mean_control, 0.8),
find_delta(design_uniform, mean_control, 0.8)),
prior=c("non-robust", "uniform 24:24", "robust", "uniform"))
::kable(target_effect, digits=3) knitr
delta | prior |
---|---|
0.298 | non-robust |
0.341 | uniform 24:24 |
0.368 | robust |
0.529 | uniform |
An alternative approach to visualize the study design to
non-statisticians is by considering data scenarios. These show the
decisions based on potential trial outcomes. The information needed are
the critical values at which the decision criterion flips. In the
2-sample case this means to calculate the decision boundary, see the
decision2S_boundary
help for more
information.
## Critical values at which the decision flips are given conditional
## on the outcome of the second read-out; as we like to have this as a
## function of the treatment group outcome, we flip label 1 and 2
<- decision2S(0.95, 0, lower.tail=TRUE)
decision_flipped <- decision2S_boundary(uniform_prior, uniform_prior, 6, 24, decision_flipped)
crit_uniform <- decision2S_boundary(map , treat_prior , 6, 24, decision_flipped)
crit_nonrobust <- decision2S_boundary(map_robust , treat_prior , 6, 24, decision_flipped)
crit_robust <- 0:24
treat_y2 ## Note that -1 is returned to indicated that the decision is never 1
<- rbind(data.frame(y2=treat_y2, y1_crit=crit_robust(treat_y2), prior="robust"),
ocC data.frame(y2=treat_y2, y1_crit=crit_nonrobust(treat_y2), prior="non-robust"),
data.frame(y2=treat_y2, y1_crit=crit_uniform(treat_y2), prior="uniform")
)
qplot(y2, y1_crit, data=ocC, colour=prior, geom="step", main="Critical values y1(y2)")
The graph shows that the decision will always be negative if there are less than 10 events in the treatment group. On the other hand, under a non-robust prior and assuming 15 events in the treatment group, three (or less) placebo events would be needed for success. To check this result, we can directly evaluate the decision function:
## just positive
decision(postmix(treat_prior, n=24, r=15), postmix(map, n=6, r=3))
## [1] 1
## negative
decision(postmix(treat_prior, n=24, r=14), postmix(map, n=6, r=4))
## [1] 0
Once the trial has completed and data is collected, the final
analysis can be run with RBesT using the
postmix
function. Calculations are
performed analytically as we are in the conjugate mixture setting.
<- 1
r_placebo <- 14
r_treat
## first obtain posterior distributions...
<- postmix(map_robust, r=r_placebo, n=6)
post_placebo <- postmix(treat_prior, r=r_treat , n=24)
post_treat
## ...then calculate probability that the difference is smaller than
## zero
<- pmixdiff(post_treat, post_placebo, 0, lower.tail=FALSE)
prob_smaller
prob_smaller
## [1] 0.9913233
> 0.95 prob_smaller
## [1] TRUE
## alternativley we can use the decision object
decision(post_treat, post_placebo)
## [1] 1
[1] Neuenschwander B. et al., Clin Trials. 2010;
7(1):5-18
[2] Baeten D. et al., The Lancet, 2013, (382), 9906, p
1705
[3] Morita S. et al., Biometrics 2008;64(2):595-602
[4] Schmidli H. et al., Biometrics 2014;70(4):1023-1032
[5] Neuenschwander B. et al., Biometrics 2020;76(2):578-587
sessionInfo()
## R version 4.1.0 (2021-05-18)
## Platform: aarch64-apple-darwin20 (64-bit)
## Running under: macOS 13.6.3
##
## Matrix products: default
## BLAS: /Library/Frameworks/R.framework/Versions/4.1-arm64/Resources/lib/libRblas.dylib
## LAPACK: /Library/Frameworks/R.framework/Versions/4.1-arm64/Resources/lib/libRlapack.dylib
##
## locale:
## [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] ggplot2_3.4.4 knitr_1.40 RBesT_1.7-3
##
## loaded via a namespace (and not attached):
## [1] Rcpp_1.0.11 mvtnorm_1.1-3 QuickJSR_1.0.6
## [4] prettyunits_1.1.1 ps_1.7.5 assertthat_0.2.1
## [7] digest_0.6.33 utf8_1.2.4 plyr_1.8.7
## [10] R6_2.5.1 backports_1.4.1 stats4_4.1.0
## [13] evaluate_0.17 highr_0.9 pillar_1.9.0
## [16] rlang_1.1.2 callr_3.7.3 jquerylib_0.1.4
## [19] checkmate_2.3.1 rmarkdown_2.20 labeling_0.4.3
## [22] textshaping_0.3.6 stringr_1.4.1 loo_2.5.1
## [25] munsell_0.5.0 compiler_4.1.0 xfun_0.37
## [28] rstan_2.26.23 pkgconfig_2.0.3 systemfonts_1.0.4
## [31] pkgbuild_1.3.1 rstantools_2.3.1.1 htmltools_0.5.3
## [34] tidyselect_1.2.0 tensorA_0.36.2.1 tibble_3.2.1
## [37] gridExtra_2.3 codetools_0.2-18 matrixStats_1.2.0
## [40] fansi_1.0.6 crayon_1.5.2 dplyr_1.0.10
## [43] withr_2.5.2 distributional_0.3.2 grid_4.1.0
## [46] jsonlite_1.8.8 gtable_0.3.4 lifecycle_1.0.4
## [49] DBI_1.1.3 posterior_1.5.0 magrittr_2.0.3
## [52] StanHeaders_2.26.28 scales_1.3.0 RcppParallel_5.1.7
## [55] cli_3.6.2 stringi_1.7.8 cachem_1.0.6
## [58] farver_2.1.1 reshape2_1.4.4 bslib_0.4.0
## [61] ragg_1.2.1 generics_0.1.3 vctrs_0.6.5
## [64] Formula_1.2-4 tools_4.1.0 glue_1.6.2
## [67] processx_3.8.3 abind_1.4-5 parallel_4.1.0
## [70] fastmap_1.1.0 yaml_2.3.6 inline_0.3.19
## [73] colorspace_2.1-0 bayesplot_1.10.0 sass_0.4.2