library(data.table)
library(ggplot2)
library(gt)
Power analysis by simulation
Power analyses inform us as to chances an experiment has of identifying a treatment differences based on our criteria, various assumptions about the design, sample size and over the effect sizes we imagine might arise. Power analyses can be implemented via simulation. The following methods provide a basic demonstration of the power analysis for an experiment with a single analysis where we consider the binary outcome under differing treatment regimes at a fixed sample and a range of effect sizes. For the sake of the example, logistic regression is used as the analysis model although one might reasonable select from a range of analysis models, with some being more efficient than others. For example, non-parametric approaches may yield lower power, but might make less assumptions, depending on the particular method chosen.
Assume:
- a baseline probability of response in the standard treatment that equals 0.2
- effect sizes from -0.25 to 0.25 on the risk scale
- sample size of 100 per treatment type
Method 1 creates a fine grid over the entire effect size range of interest and then performs a single trial for each of these effect sizes based on data simulated at this effect size. For each trial, we will either detect an effect or not based on the criteria we are using to make a decision (i.e. reject a null hypothesis). The probability of detecting an effect for each simulated trial equates to the power at that effect size. If we interpolate over these indicator values as to whether an effect was detected or not, we can produce an approximation of the power curve over the entire range.
<- 10000
n_sim <- 0.5
p_0 <- seq(-0.25, 0.25, len = n_sim)
rd <- numeric(n_sim)
win
<- rbinom(n_sim, 100, p_0)
y_0 <- rbinom(n_sim, 100, p_0 + rd)
y_1
<- 1
i for(i in 1:n_sim){
<- rbind(
y c(y_0[i], 100 - y_0[i]),
c(y_1[i], 100 - y_1[i])
)<- c(0, 1)
x
<- glm(y ~ x, family = binomial)
f1 # assume a typical frequentist critria
<- summary(f1)$coef[2, 4] < 0.025
win[i]
}
<- data.table(
d_fig_1 x = rd,
win = win
)
Method 2 simulates a large number of trials at each effect size of interest. The power at each effect size is computed as the proportion of trials where the effect was identified based on the criteria we are using to make a decision. This process is done for a range of effect sizes below. Method 2 is clearly more computationally demanding than method 1.
<- 5000
n_sim <- 0.5
p_0 <- p_0 + c(-0.2, -0.1, 0.0, 0.1, 0.2)
p_1
<- numeric(length(p_1))
pwr
for(i in 1:length(p_1)){
<- rbinom(n_sim, 100, p_0)
y_0 <- rbinom(n_sim, 100, p_1[i])
y_1
<- numeric(n_sim)
win
for(j in 1:n_sim){
<- rbind(
y c(y_0[j], 100 - y_0[j]),
c(y_1[j], 100 - y_1[j])
)<- c(0, 1)
x
<- glm(y ~ x, family = binomial)
f1 <- summary(f1)$coef[2, 4] < 0.025
win[j]
}
<- mean(win)
pwr[i]
}
<- data.table(
d_fig_2 x = p_1 - p_0,
pwr = pwr
)