Contents

library(microbiomeDataSets)
#> Loading required package: SummarizedExperiment
#> Loading required package: MatrixGenerics
#> Loading required package: matrixStats
#> 
#> Attaching package: 'MatrixGenerics'
#> The following objects are masked from 'package:matrixStats':
#> 
#>     colAlls, colAnyNAs, colAnys, colAvgsPerRowSet, colCollapse,
#>     colCounts, colCummaxs, colCummins, colCumprods, colCumsums,
#>     colDiffs, colIQRDiffs, colIQRs, colLogSumExps, colMadDiffs,
#>     colMads, colMaxs, colMeans2, colMedians, colMins, colOrderStats,
#>     colProds, colQuantiles, colRanges, colRanks, colSdDiffs, colSds,
#>     colSums2, colTabulates, colVarDiffs, colVars, colWeightedMads,
#>     colWeightedMeans, colWeightedMedians, colWeightedSds,
#>     colWeightedVars, rowAlls, rowAnyNAs, rowAnys, rowAvgsPerColSet,
#>     rowCollapse, rowCounts, rowCummaxs, rowCummins, rowCumprods,
#>     rowCumsums, rowDiffs, rowIQRDiffs, rowIQRs, rowLogSumExps,
#>     rowMadDiffs, rowMads, rowMaxs, rowMeans2, rowMedians, rowMins,
#>     rowOrderStats, rowProds, rowQuantiles, rowRanges, rowRanks,
#>     rowSdDiffs, rowSds, rowSums2, rowTabulates, rowVarDiffs, rowVars,
#>     rowWeightedMads, rowWeightedMeans, rowWeightedMedians,
#>     rowWeightedSds, rowWeightedVars
#> Loading required package: GenomicRanges
#> Loading required package: stats4
#> Loading required package: BiocGenerics
#> 
#> Attaching package: 'BiocGenerics'
#> The following objects are masked from 'package:stats':
#> 
#>     IQR, mad, sd, var, xtabs
#> The following objects are masked from 'package:base':
#> 
#>     Filter, Find, Map, Position, Reduce, anyDuplicated, append,
#>     as.data.frame, basename, cbind, colnames, dirname, do.call,
#>     duplicated, eval, evalq, get, grep, grepl, intersect, is.unsorted,
#>     lapply, mapply, match, mget, order, paste, pmax, pmax.int, pmin,
#>     pmin.int, rank, rbind, rownames, sapply, setdiff, sort, table,
#>     tapply, union, unique, unsplit, which.max, which.min
#> Loading required package: S4Vectors
#> 
#> Attaching package: 'S4Vectors'
#> The following objects are masked from 'package:base':
#> 
#>     I, expand.grid, unname
#> Loading required package: IRanges
#> Loading required package: GenomeInfoDb
#> Loading required package: Biobase
#> Welcome to Bioconductor
#> 
#>     Vignettes contain introductory material; view with
#>     'browseVignettes()'. To cite Bioconductor, see
#>     'citation("Biobase")', and for packages 'citation("pkgname")'.
#> 
#> Attaching package: 'Biobase'
#> The following object is masked from 'package:MatrixGenerics':
#> 
#>     rowMedians
#> The following objects are masked from 'package:matrixStats':
#> 
#>     anyMissing, rowMedians
#> Loading required package: TreeSummarizedExperiment
#> Loading required package: SingleCellExperiment
#> Loading required package: Biostrings
#> Loading required package: XVector
#> 
#> Attaching package: 'Biostrings'
#> The following object is masked from 'package:base':
#> 
#>     strsplit
#> Loading required package: MultiAssayExperiment

1 Microbiome example data sets

The data sets are primarily named by the first author of the associated publication, together with a descriptive suffix. Aliases are provided for some of the data sets.

A table of the available data sets is available through the availableDataSets function.

availableDataSets()
#>             Dataset
#> 1  GrieneisenTSData
#> 2    HintikkaXOData
#> 3       LahtiMLData
#> 4        LahtiMData
#> 5       LahtiWAData
#> 6      OKeefeDSData
#> 7 SilvermanAGutData
#> 8        SongQAData
#> 9   SprockettTHData

All data are downloaded from ExperimentHub and cached for local re-use. Check the man pages of each function for a detailed documentation of the data contents and original source.

The microbiome data is usually loaded as a r Biocpkg("TreeSummarizedExperiment"). If other associated data tables (metabolomic, biomarker..) are provided, the integrated data collection is provided as MultiAssayExperiment.

For more information on how to use these objects, please refer to the vignettes of those packages.

sessionInfo()
#> R version 4.2.0 RC (2022-04-19 r82224)
#> Platform: x86_64-pc-linux-gnu (64-bit)
#> Running under: Ubuntu 20.04.4 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.15-bioc/R/lib/libRblas.so
#> LAPACK: /home/biocbuild/bbs-3.15-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] stats4    stats     graphics  grDevices utils     datasets  methods  
#> [8] base     
#> 
#> other attached packages:
#>  [1] microbiomeDataSets_1.4.0       MultiAssayExperiment_1.22.0   
#>  [3] TreeSummarizedExperiment_2.4.0 Biostrings_2.64.0             
#>  [5] XVector_0.36.0                 SingleCellExperiment_1.18.0   
#>  [7] SummarizedExperiment_1.26.0    Biobase_2.56.0                
#>  [9] GenomicRanges_1.48.0           GenomeInfoDb_1.32.0           
#> [11] IRanges_2.30.0                 S4Vectors_0.34.0              
#> [13] BiocGenerics_0.42.0            MatrixGenerics_1.8.0          
#> [15] matrixStats_0.62.0             BiocStyle_2.24.0              
#> 
#> loaded via a namespace (and not attached):
#>  [1] nlme_3.1-157                  bitops_1.0-7                 
#>  [3] bit64_4.0.5                   filelock_1.0.2               
#>  [5] httr_1.4.2                    tools_4.2.0                  
#>  [7] bslib_0.3.1                   utf8_1.2.2                   
#>  [9] R6_2.5.1                      DBI_1.1.2                    
#> [11] lazyeval_0.2.2                tidyselect_1.1.2             
#> [13] bit_4.0.4                     curl_4.3.2                   
#> [15] compiler_4.2.0                cli_3.3.0                    
#> [17] DelayedArray_0.22.0           bookdown_0.26                
#> [19] sass_0.4.1                    rappdirs_0.3.3               
#> [21] stringr_1.4.0                 digest_0.6.29                
#> [23] yulab.utils_0.0.4             rmarkdown_2.14               
#> [25] pkgconfig_2.0.3               htmltools_0.5.2              
#> [27] dbplyr_2.1.1                  fastmap_1.1.0                
#> [29] rlang_1.0.2                   RSQLite_2.2.12               
#> [31] shiny_1.7.1                   jquerylib_0.1.4              
#> [33] generics_0.1.2                jsonlite_1.8.0               
#> [35] BiocParallel_1.30.0           dplyr_1.0.8                  
#> [37] RCurl_1.98-1.6                magrittr_2.0.3               
#> [39] GenomeInfoDbData_1.2.8        Matrix_1.4-1                 
#> [41] Rcpp_1.0.8.3                  fansi_1.0.3                  
#> [43] ape_5.6-2                     lifecycle_1.0.1              
#> [45] stringi_1.7.6                 yaml_2.3.5                   
#> [47] zlibbioc_1.42.0               BiocFileCache_2.4.0          
#> [49] AnnotationHub_3.4.0           grid_4.2.0                   
#> [51] blob_1.2.3                    parallel_4.2.0               
#> [53] promises_1.2.0.1              ExperimentHub_2.4.0          
#> [55] crayon_1.5.1                  lattice_0.20-45              
#> [57] KEGGREST_1.36.0               knitr_1.39                   
#> [59] pillar_1.7.0                  glue_1.6.2                   
#> [61] BiocVersion_3.15.2            evaluate_0.15                
#> [63] BiocManager_1.30.17           png_0.1-7                    
#> [65] vctrs_0.4.1                   treeio_1.20.0                
#> [67] httpuv_1.6.5                  purrr_0.3.4                  
#> [69] tidyr_1.2.0                   assertthat_0.2.1             
#> [71] cachem_1.0.6                  xfun_0.30                    
#> [73] mime_0.12                     xtable_1.8-4                 
#> [75] tidytree_0.3.9                later_1.3.0                  
#> [77] tibble_3.1.6                  AnnotationDbi_1.58.0         
#> [79] memoise_2.0.1                 ellipsis_0.3.2               
#> [81] interactiveDisplayBase_1.34.0