In this vignette, we explain how
one can compute marginal likelihoods, Bayes factors, and posterior model
probabilities using a simple hierarchical normal model implemented in
nimble
. The nimble
documentation provides a comprehensive overview. This vignette uses
the same models and data as the Stan
vignette
and Jags
vignette.
The model that we will use assumes that each of the n observations yi (where i indexes the observation, i = 1, 2, ..., n) is normally distributed with corresponding mean θi and a common known variance σ2: yi ∼ 𝒩(θi, σ2). Each θi is drawn from a normal group-level distribution with mean μ and variance τ2: θi ∼ 𝒩(μ, τ2). For the group-level mean μ, we use a normal prior distribution of the form 𝒩(μ0, τ02). For the group-level variance τ2, we use an inverse-gamma prior of the form Inv-Gamma(α, β).
In this example, we are interested in comparing the null model ℋ0, which posits that the group-level mean μ = 0, to the alternative model ℋ1, which allows μ to be different from zero. First, we generate some data from the null model:
library(bridgesampling)
### generate data ###
set.seed(12345)
mu <- 0
tau2 <- 0.5
sigma2 <- 1
n <- 20
theta <- rnorm(n, mu, sqrt(tau2))
y <- rnorm(n, theta, sqrt(sigma2))
Next, we specify the prior parameters μ0, τ02, α, and β:
Next, we implement the models in nimble
. This requires
to first transform the code into a nimbleModel
, then we
need to set the data, and then we can compile the model. Given that
nimble
is build on BUGS, the similarity between the
nimble
code and the Jags
code is
not too surprising.
library("nimble")
# models
codeH0 <- nimbleCode({
invTau2 ~ dgamma(1, 1)
tau2 <- 1/invTau2
for (i in 1:20) {
theta[i] ~ dnorm(0, sd = sqrt(tau2))
y[i] ~ dnorm(theta[i], sd = 1)
}
})
codeH1 <- nimbleCode({
mu ~ dnorm(0, sd = 1)
invTau2 ~ dgamma(1, 1)
tau2 <- 1/invTau2
for (i in 1:20) {
theta[i] ~ dnorm(mu, sd = sqrt(tau2))
y[i] ~ dnorm(theta[i], sd = 1)
}
})
## steps for H0:
modelH0 <- nimbleModel(codeH0)
modelH0$setData(y = y) # set data
cmodelH0 <- compileNimble(modelH0) # make compiled version from generated C++
## steps for H1:
modelH1 <- nimbleModel(codeH1)
modelH1$setData(y = y) # set data
cmodelH1 <- compileNimble(modelH1) # make compiled version from generated C++
Fitting a model with nimble
requires one to first create
an MCMC function from the (compiled or uncompiled) model. This function
then needs to be compiled again. With this object we can then create the
samples. Note that nimble uses a reference object semantic so we do not
actually need the samples object, as the samples will be saved in the
MCMC function objects. But as runMCMC
returns them anyway,
we nevertheless save them.
One usually requires a larger number of posterior samples for estimating the marginal likelihood than for simply estimating the model parameters. This is the reason for using a comparatively large number of samples for these simple models.
# build MCMC functions, skipping customization of the configuration.
mcmcH0 <- buildMCMC(modelH0,
monitors = modelH0$getNodeNames(stochOnly = TRUE,
includeData = FALSE))
mcmcH1 <- buildMCMC(modelH1,
monitors = modelH1$getNodeNames(stochOnly = TRUE,
includeData = FALSE))
# compile the MCMC function via generated C++
cmcmcH0 <- compileNimble(mcmcH0, project = modelH0)
cmcmcH1 <- compileNimble(mcmcH1, project = modelH1)
# run the MCMC. This is a wrapper for cmcmc$run() and extraction of samples.
# the object samplesH1 is actually not needed as the samples are also in cmcmcH1
samplesH0 <- runMCMC(cmcmcH0, niter = 1e5, nburnin = 1000, nchains = 2,
progressBar = FALSE)
samplesH1 <- runMCMC(cmcmcH1, niter = 1e5, nburnin = 1000, nchains = 2,
progressBar = FALSE)
Computing the (log) marginal likelihoods via the
bridge_sampler
function is now easy: we only need to pass
the compiled MCMC function objects (of class
"MCMC_refClass"
) which contain all information necessary.
We use silent = TRUE
to suppress printing the number of
iterations to the console:
# compute log marginal likelihood via bridge sampling for H0
H0.bridge <- bridge_sampler(cmcmcH0, silent = TRUE)
# compute log marginal likelihood via bridge sampling for H1
H1.bridge <- bridge_sampler(cmcmcH1, silent = TRUE)
We obtain:
## Bridge sampling estimate of the log marginal likelihood: -37.52918
## Estimate obtained in 4 iteration(s) via method "normal".
## Bridge sampling estimate of the log marginal likelihood: -37.80257
## Estimate obtained in 4 iteration(s) via method "normal".
We can use the error_measures
function to compute an
approximate percentage error of the estimates:
# compute percentage errors
H0.error <- error_measures(H0.bridge)$percentage
H1.error <- error_measures(H1.bridge)$percentage
We obtain:
## [1] "0.2%"
## [1] "0.22%"
To compare the null model and the alternative model, we can compute
the Bayes factor by using the bf
function. In our case, we
compute BF01, that is, the
Bayes factor which quantifies how much more likely the data are under
the null versus the alternative model:
## Estimated Bayes factor in favor of H0.bridge over H1.bridge: 1.31441
In this case, the Bayes factor is close to one, indicating that there
is not much evidence for either model. We can also compute posterior
model probabilities by using the post_prob
function:
# compute posterior model probabilities (assuming equal prior model probabilities)
post1 <- post_prob(H0.bridge, H1.bridge)
print(post1)
## H0.bridge H1.bridge
## 0.5679244 0.4320756
When the argument prior_prob
is not specified, as is the
case here, the prior model probabilities of all models under
consideration are set equal (i.e., in this case with two models to 0.5).
However, if we had prior knowledge about how likely both models are, we
could use the prior_prob
argument to specify different
prior model probabilities:
# compute posterior model probabilities (using user-specified prior model probabilities)
post2 <- post_prob(H0.bridge, H1.bridge, prior_prob = c(.6, .4))
print(post2)
## H0.bridge H1.bridge
## 0.6634826 0.3365174