MetaGxPancreas: A Package for Pancreatic Cancer Gene Expression Analysis

list(name = “Michael Zon”, affiliation = “Department of Medical Biophysics, University of Toronto, Toronto, Canada”) list(name = “Vandana Sandhu”, affiliation = “Department of Medical Biophysics, University of Toronto, Toronto, Canada”) list(name = “Benjamin Haibe-Kains”, email = “benjamin.haibe.kains@utoronto.ca”, affiliation = c(“Department of Medical Biophysics, University of Toronto, Toronto, Canada”, “Bioinformatics and Computational Genomics Laboratory, Princess Margaret Cancer Center, University Health Network, Toronto, Ontario, Canada”))

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
## 
## 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, aperm, 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:utils':
## 
##     findMatches
## 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: 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()
## 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.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-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_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       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] MetaGxPancreas_1.22.0       ExperimentHub_2.10.0       
##  [3] AnnotationHub_3.10.0        BiocFileCache_2.10.0       
##  [5] dbplyr_2.3.4                SummarizedExperiment_1.32.0
##  [7] Biobase_2.62.0              GenomicRanges_1.54.0       
##  [9] GenomeInfoDb_1.38.0         IRanges_2.36.0             
## [11] S4Vectors_0.40.0            BiocGenerics_0.48.0        
## [13] MatrixGenerics_1.14.0       matrixStats_1.0.0          
## 
## loaded via a namespace (and not attached):
##  [1] KEGGREST_1.42.0               impute_1.76.0                
##  [3] xfun_0.40                     lattice_0.22-5               
##  [5] vctrs_0.6.4                   tools_4.3.1                  
##  [7] bitops_1.0-7                  generics_0.1.3               
##  [9] curl_5.1.0                    AnnotationDbi_1.64.0         
## [11] tibble_3.2.1                  fansi_1.0.5                  
## [13] RSQLite_2.3.1                 blob_1.2.4                   
## [15] pkgconfig_2.0.3               Matrix_1.6-1.1               
## [17] lifecycle_1.0.3               GenomeInfoDbData_1.2.11      
## [19] compiler_4.3.1                Biostrings_2.70.1            
## [21] httpuv_1.6.12                 htmltools_0.5.6.1            
## [23] RCurl_1.98-1.12               yaml_2.3.7                   
## [25] interactiveDisplayBase_1.40.0 pillar_1.9.0                 
## [27] later_1.3.1                   crayon_1.5.2                 
## [29] ellipsis_0.3.2                DelayedArray_0.28.0          
## [31] cachem_1.0.8                  abind_1.4-5                  
## [33] mime_0.12                     tidyselect_1.2.0             
## [35] digest_0.6.33                 purrr_1.0.2                  
## [37] dplyr_1.1.3                   BiocVersion_3.18.0           
## [39] fastmap_1.1.1                 grid_4.3.1                   
## [41] cli_3.6.1                     SparseArray_1.2.0            
## [43] magrittr_2.0.3                S4Arrays_1.2.0               
## [45] utf8_1.2.4                    withr_2.5.1                  
## [47] filelock_1.0.2                promises_1.2.1               
## [49] rappdirs_0.3.3                bit64_4.0.5                  
## [51] XVector_0.42.0                httr_1.4.7                   
## [53] bit_4.0.5                     png_0.1-8                    
## [55] memoise_2.0.1                 shiny_1.7.5.1                
## [57] evaluate_0.22                 knitr_1.44                   
## [59] rlang_1.1.1                   Rcpp_1.0.11                  
## [61] xtable_1.8-4                  glue_1.6.2                   
## [63] DBI_1.1.3                     BiocManager_1.30.22          
## [65] R6_2.5.1                      zlibbioc_1.48.0