Contents

library(graper)
library(ggplot2)

Note that the implementation of logistic regression is still experimental. In particular, it has not yet been optimized in terms of computational speed and can be slow for large data sets. Furthermore, calculations of the evidence lower bound are currently not implemented to monitor convergence of the variational inference and the algorithm will stop only when the maximum number of iterations has been reached. This needs to be set to a sufficiently large number.

1 Make example data with four groups

Create an example data set with 4 groups, 100 train + 100 test samples and 320 features.

set.seed(123)
data <- makeExampleData(n=200, p=320, g=4,
                        pis=c(0.05, 0.1, 0.05, 0.1),
                        gammas=c(0.1, 0.1, 10, 10),
                        response="bernoulli")
# training data set
Xtrain <- data$X[1:100, ]
ytrain <- data$y[1:100]

# annotations of features to groups
annot <- data$annot

# test data set
Xtest <- data$X[101:200, ]
ytest <- data$y[101:200]

2 Fit the model

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 ELBO is currently not calculated in the logisitc regession framework.

fit <- graper(Xtrain, ytrain, annot, verbose=FALSE,
            family="binomial", calcELB=FALSE)
## Fitting a model with 4 groups, 100 samples and 320 features.
## Fitting with random init 1
## Maximum numbers of iterations reached - no convergence or ELB not calculated
fit
## Sparse graper object for a logistic regression model with 320 predictors in 4 groups.
##  Group-wise shrinkage:
##  1   2   3   4 
##  170.93  4.17    297.4   329.72 
## Group-wise sparsity (1 = dense, 0 = sparse):
## 1    2   3   4 
## 0.35 0.1 0.29    0.25

3 Posterior distribtions

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)

plotPosterior(fit, "pi", pi0=data$pis)

4 Model coefficients and intercept

The estimated coefficients, their posterior inclusion probabilities 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)

# get intercept
intercept <- fit$intercept
# get estimated posterior inclusion probabilities per feature
pips <- getPIPs(fit)

5 Make predictions

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)

#SessionInfo

sessionInfo()
## R Under development (unstable) (2023-10-22 r85388)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.19-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.0
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        LC_COLLATE=en_US.UTF-8    
##  [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       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] ggplot2_3.4.4    graper_1.19.0    BiocStyle_2.31.0
## 
## loaded via a namespace (and not attached):
##  [1] Matrix_1.6-1.1      gtable_0.3.4        jsonlite_1.8.7     
##  [4] crayon_1.5.2        dplyr_1.1.3         compiler_4.4.0     
##  [7] BiocManager_1.30.22 tidyselect_1.2.0    Rcpp_1.0.11        
## [10] magick_2.8.1        jquerylib_0.1.4     scales_1.2.1       
## [13] yaml_2.3.7          fastmap_1.1.1       lattice_0.22-5     
## [16] R6_2.5.1            labeling_0.4.3      generics_0.1.3     
## [19] knitr_1.44          tibble_3.2.1        bookdown_0.36      
## [22] munsell_0.5.0       bslib_0.5.1         pillar_1.9.0       
## [25] rlang_1.1.1         utf8_1.2.4          cachem_1.0.8       
## [28] xfun_0.40           sass_0.4.7          cli_3.6.1          
## [31] withr_2.5.1         magrittr_2.0.3      digest_0.6.33      
## [34] grid_4.4.0          cowplot_1.1.1       lifecycle_1.0.3    
## [37] vctrs_0.6.4         evaluate_0.22       glue_1.6.2         
## [40] farver_2.1.1        fansi_1.0.5         colorspace_2.1-0   
## [43] rmarkdown_2.25      matrixStats_1.0.0   tools_4.4.0        
## [46] pkgconfig_2.0.3     htmltools_0.5.6.1