Installing the Package

The MetaGxPancreas package is a compendium of Pancreatic Cancer datasets. The package is publicly available and can be installed from Bioconductor into R version 3.6.0 or higher. Currently, the phenoData for the datasets is overall survival status and overall survival time. This survival information is available for 11 of the 15 datasets.

if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("MetaGxPancreas")

Loading Datasets

First we load the MetaGxPancreas package into the workspace.

library(MetaGxPancreas)
## 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
## Loading required package: parallel
## 
## Attaching package: 'BiocGenerics'
## The following objects are masked from 'package:parallel':
## 
##     clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
##     clusterExport, clusterMap, parApply, parCapply, parLapply,
##     parLapplyLB, parRapply, parSapply, parSapplyLB
## 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 object is masked from 'package:base':
## 
##     expand.grid
## 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: ExperimentHub
## Loading required package: AnnotationHub
## Loading required package: BiocFileCache
## Loading required package: dbplyr
## 
## Attaching package: 'AnnotationHub'
## The following object is masked from 'package:Biobase':
## 
##     cache
pancreasData <- loadPancreasDatasets()
## Cannot connect to ExperimentHub server, using 'localHub=TRUE' instead
## snapshotDate(): 2020-10-02
## Filtered out duplicated samples: ICGC_0400, ICGC_0402, GSM388116, GSM388118, GSM388120, GSM388145, GSM299238, GSM299239, GSM299240
duplicates <- pancreasData$duplicates
SEs <- pancreasData$SEs

This will load 15 expression datasets. Users can modify the parameters of the function to restrict datasets that do not meet certain criteria for loading. Some example parameters are shown below:

Obtaining Sample Counts in Datasets

To obtain the number of samples per dataset, run the following:

numSamples <- vapply(SEs, function(SE) length(colnames(SE)), FUN.VALUE=numeric(1))

sampleNumberByDataset <- data.frame(numSamples=numSamples,
                                    row.names=names(SEs))

totalNumSamples <- sum(sampleNumberByDataset$numSamples)
sampleNumberByDataset <- rbind(sampleNumberByDataset, totalNumSamples)
rownames(sampleNumberByDataset)[nrow(sampleNumberByDataset)] <- 'Total'

knitr::kable(sampleNumberByDataset)
X0
Total 0

SessionInfo

sessionInfo()
## R version 4.0.3 (2020-10-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.12-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.12-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        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] parallel  stats4    stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
##  [1] MetaGxPancreas_1.10.0       ExperimentHub_1.16.0       
##  [3] AnnotationHub_2.22.0        BiocFileCache_1.14.0       
##  [5] dbplyr_1.4.4                SummarizedExperiment_1.20.0
##  [7] Biobase_2.50.0              GenomicRanges_1.42.0       
##  [9] GenomeInfoDb_1.26.0         IRanges_2.24.0             
## [11] S4Vectors_0.28.0            BiocGenerics_0.36.0        
## [13] MatrixGenerics_1.2.0        matrixStats_0.57.0         
## 
## loaded via a namespace (and not attached):
##  [1] tidyselect_1.1.0              xfun_0.18                    
##  [3] BiocVersion_3.12.0            purrr_0.3.4                  
##  [5] lattice_0.20-41               vctrs_0.3.4                  
##  [7] generics_0.0.2                htmltools_0.5.0              
##  [9] yaml_2.2.1                    interactiveDisplayBase_1.28.0
## [11] blob_1.2.1                    rlang_0.4.8                  
## [13] pillar_1.4.6                  later_1.1.0.1                
## [15] glue_1.4.2                    DBI_1.1.0                    
## [17] rappdirs_0.3.1                bit64_4.0.5                  
## [19] GenomeInfoDbData_1.2.4        lifecycle_0.2.0              
## [21] stringr_1.4.0                 zlibbioc_1.36.0              
## [23] evaluate_0.14                 memoise_1.1.0                
## [25] knitr_1.30                    fastmap_1.0.1                
## [27] httpuv_1.5.4                  curl_4.3                     
## [29] AnnotationDbi_1.52.0          highr_0.8                    
## [31] Rcpp_1.0.5                    xtable_1.8-4                 
## [33] promises_1.1.1                BiocManager_1.30.10          
## [35] DelayedArray_0.16.0           XVector_0.30.0               
## [37] mime_0.9                      bit_4.0.4                    
## [39] impute_1.64.0                 digest_0.6.27                
## [41] stringi_1.5.3                 dplyr_1.0.2                  
## [43] shiny_1.5.0                   grid_4.0.3                   
## [45] tools_4.0.3                   bitops_1.0-6                 
## [47] magrittr_1.5                  RCurl_1.98-1.2               
## [49] tibble_3.0.4                  RSQLite_2.2.1                
## [51] crayon_1.3.4                  pkgconfig_2.0.3              
## [53] ellipsis_0.3.1                Matrix_1.2-18                
## [55] assertthat_0.2.1              httr_1.4.2                   
## [57] R6_2.5.0                      compiler_4.0.3