library(graper)
library(ggplot2)Create an example data set with 4 groups, 400 train + 100 test samples and 800 features.
set.seed(123)
data <- makeExampleData(n = 500, p=800, g=4,
                        pis=c(0.05, 0.1, 0.05, 0.1),
                        gammas=c(0.1, 0.1, 10, 10))
# training data set
Xtrain <- data$X[1:400, ]
ytrain <- data$y[1:400]
# annotations of features to groups
annot <- data$annot
# test data set
Xtest <- data$X[401:500, ]
ytest <- data$y[401:500]graper is the main function of this package,
which allows to fit the proposed Bayesian models with
different settings on the prior (by setting spikeslab to FALSE or TRUE) and
the variational approximation (by setting factoriseQ to FALSE or TRUE).
By default, the model is fit with a sparsity promoting spike-and-slab prior
and a fully-factorised mean-field assumption. The parameter n_rep can be used
to train multiple models with different random initializations.
The best model is then chosen in terms of ELBO and returned by the function.
th defines the threshold on the ELBO for convergence
in the variational Bayes (VB) algorithm used for optimization.
fit <- graper(Xtrain, ytrain, annot,
            n_rep=3, verbose=FALSE, th=0.001)## Fitting a model with 4 groups, 400 samples and 800 features.## Fitting with random init 1## ELB converged## Fitting with random init 2## ELB converged## Fitting with random init 3## ELB convergedfit## Sparse graper object for a linear regression model with 800 predictors in 4 groups.
##  Group-wise shrinkage:
##  1   2   3   4 
##  0.22    0.07    8.25    7.13 
## Group-wise sparsity (1 = dense, 0 = sparse):
## 1    2   3   4 
## 0.06 0.14    0.04    0.1The ELBO monitors the convergence during training.
plotELBO(fit)The variational Bayes (VB) approach directly yields posterior distributions for each parameter. Note, however, that using VB these are often too concentrated and cannot be directly used for construction of confidence intervals etc. However, they can provide good point estimates.
plotPosterior(fit, "gamma", gamma0=data$gammas, range=c(0, 20))plotPosterior(fit, "pi", pi0=data$pis)The estimated coefficients and the intercept are contained in the result list.
# get coefficients (without the intercept)
beta <- coef(fit, include_intercept=FALSE)
# beta <- fit$EW_beta
# plot estimated versus true beta
qplot(beta, data$beta) +
    coord_fixed() + theme_bw()## Warning: `qplot()` was deprecated in ggplot2 3.4.0.# get intercept
intercept <- fit$interceptThe estimated posterior inclusion probabilities per feature
are contained in the result list and can also be accessed
using getPIPs
# get estimated posterior inclusion probabilities per feature
pips <- getPIPs(fit)
# plot pips for zero versus non-zero features
df <- data.frame(pips = pips,
                nonzero = data$beta != 0)
ggplot(df, aes(x=nonzero, y=pips, col=nonzero)) +
    geom_jitter(height=0, width=0.2) +
    theme_bw() + ylab("Posterior inclusion probability")The function plotGroupPenalties can be used to plot the
penalty factors and sparsity levels inferred for each
feature group.
plotGroupPenalties(fit)The function predict can be used to make prediction on new data.
Here, we illustrate its use by predicting the response on
the test data defined above.
preds <- predict(fit, Xtest)
qplot(preds, ytest) +
    coord_fixed() + theme_bw()#SessionInfo
sessionInfo()## R version 4.2.2 (2022-10-31)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.16-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_GB              LC_COLLATE=C              
##  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
##  [9] LC_ADDRESS=C               LC_TELEPHONE=C            
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] ggplot2_3.4.0    graper_1.14.2    BiocStyle_2.26.0
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.9          highr_0.10          bslib_0.4.2        
##  [4] compiler_4.2.2      pillar_1.8.1        BiocManager_1.30.19
##  [7] jquerylib_0.1.4     tools_4.2.2         digest_0.6.31      
## [10] lattice_0.20-45     jsonlite_1.8.4      evaluate_0.20      
## [13] lifecycle_1.0.3     tibble_3.1.8        gtable_0.3.1       
## [16] pkgconfig_2.0.3     rlang_1.0.6         Matrix_1.5-3       
## [19] DBI_1.1.3           cli_3.6.0           magick_2.7.3       
## [22] yaml_2.3.6          xfun_0.36           fastmap_1.1.0      
## [25] withr_2.5.0         stringr_1.5.0       dplyr_1.0.10       
## [28] knitr_1.41          generics_0.1.3      vctrs_0.5.1        
## [31] sass_0.4.4          cowplot_1.1.1       tidyselect_1.2.0   
## [34] grid_4.2.2          glue_1.6.2          R6_2.5.1           
## [37] fansi_1.0.3         rmarkdown_2.19      bookdown_0.32      
## [40] farver_2.1.1        magrittr_2.0.3      matrixStats_0.63.0 
## [43] scales_1.2.1        htmltools_0.5.4     assertthat_0.2.1   
## [46] colorspace_2.0-3    labeling_0.4.2      utf8_1.2.2         
## [49] stringi_1.7.12      munsell_0.5.0       cachem_1.0.6