This vignette shows detailed examples for the getGEMatrix function.

Contents

  1. Connections
  2. List the expression matrices
  3. Download an expression matrix
  4. Summarized matrices
  5. Combining matrices
  6. Caching
  7. sessionInfo

Connections

As explained into the user guide vignette, datasets must be downloaded from ImmuneSpaceConnection objects. We must first instantiate a connection to the study or studies of interest. Throughout this vignette, we will use two connections, one to a single study, and one to to all available data.

library(ImmuneSpaceR)
sdy269 <- CreateConnection("SDY269")
all <- CreateConnection("")

List the expression matrices

Now that the connections have been instantiated, we can start downloading from them. But we need to figure out which processed matrices are available within our chosen studies.

On www.immunespace.org, in the study of interest or at the project level, the Gene expression matrices table will show the available runs.

Printing the connections will, among other information, list the datasets availables. The listDatasets method will only display the downloadable data. looking for. With which = "expression", the datasets wont be printed.

sdy269$listDatasets()
## datasets
##  demographics
##  pcr
##  cohort_membership
##  elisa
##  elispot
##  hai
##  gene_expression_files
##  fcs_analyzed_result
##  fcs_sample_files
## Expression Matrices
##  TIV_2008
##  LAIV_2008

Using wich = "expression", we can remove the datasets from the output.

all$listDatasets(which = "expression")
## Expression Matrices
##  TIV_older
##  SDY296_AIRFV_2011
##  LAIV_2008
##  TIV_2008
##  TIV_2007
##  pH1N1_2009
##  TIV_young
##  SDY63_older_PBMC_year1
##  SDY63_young_PBMC_year1
##  SDY404_older_PBMC_year2
##  SDY404_young_PBMC_year2
##  Cohort1_young
##  Cohort2_older
##  TIV_2011
##  Pneumovax23_group1
##  Fluzone_group1
##  Fluzone_group2
##  Pneumovax23_group2
##  Saline_group1
##  Saline_group2
##  VLminus
##  VLplus
##  TIV_2010
##  SDY301_AIRFV_2012

Naturally, all contains every processed matrices available on ImmuneSpace as it combines all available studies.

Back to top

Download

By run name

The getGEMatrix function will accept any of the run names listed in the connection.

TIV_2008 <- sdy269$getGEMatrix("TIV_2008")
## Downloading matrix..
## Downloading Features..
## Constructing ExpressionSet
TIV_2011 <- all$getGEMatrix(x = "TIV_2011")
## Downloading matrix..
## Downloading Features..
## Constructing ExpressionSet

The matrices are returned as ExpressionSet where the phenoData slot contains basic demographic information and the featureData slot shows a mapping of probe to official gene symbols.

TIV_2008
## ExpressionSet (storageMode: lockedEnvironment)
## assayData: 54715 features, 80 samples 
##   element names: exprs 
## protocolData: none
## phenoData
##   sampleNames: BS586131 BS586187 ... BS586267 (80 total)
##   varLabels: biosample_accession participant_id ...
##     study_time_collected_unit (5 total)
##   varMetadata: labelDescription
## featureData
##   featureNames: 1007_PM_s_at 1053_PM_at ... AFFX-r2-TagQ-5_at
##     (54715 total)
##   fvarLabels: FeatureId gene_symbol
##   fvarMetadata: labelDescription
## experimentData: use 'experimentData(object)'
## Annotation:

By cohort

The cohort argument can be used in place of the run name (x). Likewise, the list of valid cohorts can be found in the Gene expression matrices table.

LAIV_2008 <- sdy269$getGEMatrix(cohort = "LAIV group 2008")
## Downloading matrix..
## Constructing ExpressionSet

Note that when cohort is used, x is ignored.

Back to top

Summarized matrices

By default, the returned ExpressionSets have probe names as features (or rows). However, multiple probes often match the same gene and merging experiments from different arrays is impossible at feature level. When they are available, the summary argument allows to return the matrices with gene symbols instead of probes.

TIV_2008_sum <- sdy269$getGEMatrix("TIV_2008", summary = TRUE)
## Downloading matrix..
## Constructing ExpressionSet

Probes that do not map to a unique gene are removed and expression is averaged by gene.

TIV_2008_sum
## ExpressionSet (storageMode: lockedEnvironment)
## assayData: 16910 features, 80 samples 
##   element names: exprs 
## protocolData: none
## phenoData
##   sampleNames: BS586131 BS586187 ... BS586267 (80 total)
##   varLabels: biosample_accession participant_id ...
##     study_time_collected_unit (5 total)
##   varMetadata: labelDescription
## featureData
##   featureNames: DDR1 RFC2 ... NUS1P3 (16910 total)
##   fvarLabels: FeatureId gene_symbol
##   fvarMetadata: labelDescription
## experimentData: use 'experimentData(object)'
## Annotation:

Back to top

Combining matrices

In order to faciliate analysis across experiments and studies, when multiple runs or cohorts are specified, getGEMatrix will attempt to combine the selected expression matrices into a single ExpressionSet.

To avoid returning an empty object, it is usually recommended to use the summarized version of the matrices, thus combining by genes. This is almost always necessary when combining data from multiple studies.

# Within a study
em269 <- sdy269$getGEMatrix(c("TIV_2008", "LAIV_2008"))
## Downloading matrix..
## Downloading matrix..
## Constructing ExpressionSet
## Constructing ExpressionSet
## Combining ExpressionSets
# Combining accross studies
TIV_seasons <- all$getGEMatrix(c("TIV_2008", "TIV_2011"), summary = TRUE)
## Downloading matrix..
## Downloading matrix..
## Constructing ExpressionSet
## Constructing ExpressionSet
## Combining ExpressionSets

Caching

As explained in the user guide, the ImmuneSpaceConnection class is a Reference class. It means its objects have fields accessed by reference. As a consequence, they can be modified without making a copy of the entire object. ImmuneSpaceR uses this feature to store downloaded datasets and expression matrices. Subsequent calls to getGEMatrix with the same input will be faster.

See ?setRefClass for more information about reference classes.

We can see a list of already downloaded runs and feature sets the data_cache field. This is not intended to be used for data manipulation and only displayed here to explain what gets cached.

names(sdy269$data_cache)
## [1] "GE_matrices"   "featureset_18" "TIV_2008_sum"  "TIV_2008"     
## [5] "LAIV_2008"

If, for any reason, a specific marix needs to be redownloaded, the reload argument will clear the cache for that specific getGEMatrix call and download the file and metadata again.

TIV_2008 <- sdy269$getGEMatrix("TIV_2008", reload = TRUE)
## Downloading matrix..
## Constructing ExpressionSet

Finally, it is possible to clear every cached expression matrix (and dataset).

sdy269$clear_cache()

Again, the data.cache field should never be modified manually. When in doubt, simply reload the expression matrix.

Back to top

sessionInfo()

sessionInfo()
## R version 3.3.1 (2016-06-21)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 16.04.1 LTS
## 
## 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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] Rlabkey_2.1.131    rjson_0.2.15       RCurl_1.95-4.8    
## [4] bitops_1.0-6       ImmuneSpaceR_1.2.0 rmarkdown_1.1     
## [7] knitr_1.14        
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_0.12.7         magrittr_1.5        BiocGenerics_0.20.0
##  [4] munsell_0.4.3       colorspace_1.2-7    plyr_1.8.4         
##  [7] stringr_1.1.0       caTools_1.17.1      tools_3.3.1        
## [10] parallel_3.3.1      grid_3.3.1          Biobase_2.34.0     
## [13] data.table_1.9.6    gtable_0.2.0        KernSmooth_2.23-15 
## [16] gtools_3.5.0        htmltools_0.3.5     yaml_2.1.13        
## [19] assertthat_0.1      digest_0.6.10       tibble_1.2         
## [22] reshape2_1.4.1      RColorBrewer_1.1-2  ggplot2_2.1.0      
## [25] formatR_1.4         evaluate_0.10       labeling_0.3       
## [28] pheatmap_1.0.8      gdata_2.17.0        stringi_1.1.2      
## [31] gplots_3.0.1        scales_0.4.0        chron_2.3-47