reconsi package: vignette

Introduction

The aim of this pacakage is to improve simultaneous inference for correlated hypotheses using collapsed null distributions. These collapsed null distributions are estimated in an empirical Bayes framework through resampling. Wilcoxon rank sum test and two sample t-test are natively implemented, but any other test can be used.

Installation

library(BiocManager)
BiocManager::install("reconsi")
library(devtools)
install_github("CenterForStatistics-UGent/reconsi")
suppressPackageStartupMessages(library(reconsi))
cat("reconsi package version", as.character(packageVersion("reconsi")), "\n")
## reconsi package version 1.6.0

General use

We illustrate the general use of the package on a synthetic dataset. The default Wilcoxon rank-sum test is used.

The method provides an estimate of the proportion of true null hypothesis, which is close to the true 90%.

## [1] 0.9154225

The result of the procedure can be represented graphically as follows:

## Warning: Removed 282 row(s) containing missing values (geom_path).
## Warning: It is deprecated to specify `guide = FALSE` to remove a guide. Please
## use `guide = "none"` instead.

## Warning: It is deprecated to specify `guide = FALSE` to remove a guide. Please
## use `guide = "none"` instead.

The approximate correlation matrix of test statistic can be visualized as follows:

It is also possible to provide a custom test function, which must accept at least a ‘y’ response variable and a ‘x’ grouping factor. Additionally, quantile, distribution and density functions should be supplied for transformation through quantiles to z-values.

This framework also accepts more than 2 groups, and additional covariates through the “argList” argument.

If the null distribution of the test statistic is not known, it is also possbile to execute the procedure on the scale of the original test statistics, rather than z-values by setting zValues = FALSE. This may be numerically less stable.

Alternatively, the same resampling instances may be used to determine the marginal null distributions as to estimate the collapsed null distribution, by setting the “resamZvals” flag to true.

When no grouping variable is available, one can perform a bootstrap as resampling procedure. This is achieved by simply not supplying a grouping variable “x”. Here we perform a one sample Wilcoxon rank sum test for equality of the means to 0.

Case study

We illustrate the package using an application from microbiology. The species composition of a community of microorganisms can be determined through sequencing. However, this only yields compositional information, and knowledge of the population size can be acquired by cell counting through flow cytometry. Next, the obtained species compositions can multiplied by the total population size to yield approximate absolute cell counts per species. Evidently, this introduces strong correlation between the tests due to the common factor. In other words: random noise in the estimation of the total cell counts will affect all hypotheses. Therefore, we employ resampling to estimate the collapsed null distribution, that will account for this dependence.

The dataset used is taken from Vandeputte et al., 2017 (see manuscript), a study on gut microbiome in healthy and Crohn’s disease patients. The test looks for differences in absolute abundance between healthy and diseased patients. It relies on the phyloseq package, which is the preferred way to interact with our machinery for microbiome data.

The estimated tail-area false discovery rates can then simply be extracted as

##           0%          25%          50%          75%         100% 
## 3.105368e-19 3.286020e-03 3.795398e-01 7.586717e-01 9.060601e-01

Session info

Finally all info on R and package version is shown

sessionInfo()
## R version 4.1.1 (2021-08-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.14-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] reconsi_1.6.0
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.7             ape_5.5                phyloseq_1.38.0       
##  [4] lattice_0.20-45        Biostrings_2.62.0      assertthat_0.2.1      
##  [7] digest_0.6.28          foreach_1.5.1          utf8_1.2.2            
## [10] R6_2.5.1               GenomeInfoDb_1.30.0    plyr_1.8.6            
## [13] stats4_4.1.1           evaluate_0.14          highr_0.9             
## [16] ggplot2_3.3.5          pillar_1.6.4           zlibbioc_1.40.0       
## [19] rlang_0.4.12           data.table_1.14.2      vegan_2.5-7           
## [22] jquerylib_0.1.4        S4Vectors_0.32.0       Matrix_1.3-4          
## [25] rmarkdown_2.11         labeling_0.4.2         splines_4.1.1         
## [28] stringr_1.4.0          igraph_1.2.7           RCurl_1.98-1.5        
## [31] munsell_0.5.0          compiler_4.1.1         xfun_0.27             
## [34] pkgconfig_2.0.3        BiocGenerics_0.40.0    multtest_2.50.0       
## [37] mgcv_1.8-38            htmltools_0.5.2        biomformat_1.22.0     
## [40] tidyselect_1.1.1       tibble_3.1.5           GenomeInfoDbData_1.2.7
## [43] matrixStats_0.61.0     IRanges_2.28.0         codetools_0.2-18      
## [46] permute_0.9-5          fansi_0.5.0            crayon_1.4.1          
## [49] dplyr_1.0.7            rhdf5filters_1.6.0     MASS_7.3-54           
## [52] bitops_1.0-7           grid_4.1.1             nlme_3.1-153          
## [55] jsonlite_1.7.2         gtable_0.3.0           lifecycle_1.0.1       
## [58] DBI_1.1.1              magrittr_2.0.1         scales_1.1.1          
## [61] KernSmooth_2.23-20     stringi_1.7.5          farver_2.1.0          
## [64] XVector_0.34.0         reshape2_1.4.4         bslib_0.3.1           
## [67] ellipsis_0.3.2         generics_0.1.1         vctrs_0.3.8           
## [70] Rhdf5lib_1.16.0        iterators_1.0.13       tools_4.1.1           
## [73] ade4_1.7-18            Biobase_2.54.0         glue_1.4.2            
## [76] purrr_0.3.4            survival_3.2-13        parallel_4.1.1        
## [79] fastmap_1.1.0          yaml_2.2.1             colorspace_2.0-2      
## [82] rhdf5_2.38.0           cluster_2.1.2          knitr_1.36            
## [85] sass_0.4.0