ccmap finds drugs and drug combinations that are predicted to reverse or mimic gene expression signatures. These drugs might reverse diseases or mimic healthy lifestyles.
To obtain a query gene expression signature, it is reccommended that you perform a meta-analysis of all gene expression studies that have compared similar groups. This can be accomplished with the crossmeta package.
This meta-analysis approach was validated by querying the cmap drug signatures using independant drug expression data. Query signatures from meta-analyses have improved rankings of the selfsame cmap drugs (figure 1).
Figure 1. Receiver operating curves comparing query results using signatures from individual contrasts (auc = 0.720) to meta-analyses (auc = 0.913). Queries from signatures generated by meta-analyses for 10 drugs were compared to queries from the 260 contrasts used in the meta-analyses.
To use ccmap, the query signature needs to be a named vector of effect size values where the names correspond to uppercase HGNC symbols. If you used crossmeta, proceeed as follows:
library(crossmeta)
library(ccmap)
# microarray data from studies using drug LY-294002
library(lydata)
data_dir <- system.file("extdata", package = "lydata")
# gather all GSEs
gse_names  <- c("GSE9601", "GSE15069", "GSE50841", "GSE34817", "GSE29689")
# load previous crossmeta differential expression analysis
anals <- load_diff(gse_names, data_dir)
# run meta-analysis
es <- es_meta(anals)
# contribute your signature to our public meta-analysis database
# contribute(anals, subject = "LY-294002")
# extract moderated adjusted standardized effect sizes
dprimes <- get_dprimes(es)
# query signature
query_sig <- dprimes$all$metaCMAP drug signatures were generated using the raw data from the Connectivity Map build 2. The raw data from experiments with a shared platform were norm-exp background corrected, quantile normalized, and log2 transformed (RMA algorithm). After preprocessing, contrasts were specified such that all signatures for each drug were compared to all vehicle treated signatures. Non-treatment related variables (cell-line, drug dose, batch effects, etc.) were discovered using sva and accounted for during differential expression analysis by limma. Finally, moderated t-statistics calculated by limma were used by GeneMeta to calculate moderated unbiased standardised effect sizes.
The final drug signatures are available in the ccdata package.
library(ccdata)
# load drug signatures
data(cmap_es)LINCS l1000 signatures (drugs and genetic under/over expression) were generated using the raw level 1 lxb files. For each cell line, all vehicle wells were quantile normalized. These were used as reference distributions in order to quantile normalize all treatment wells for the corresponding cell line. For deconvolution of each probe pair in each well, four gaussian mixtures models were fitted to the normalized and log2 transformed data: 1) Mclust with equal variance, 2) Mclust with equal variance and outliers initialized by spoutlier, 3/4) a modified mixtools model excluding outliers determined from (2) and biased towards the predominant peak lying at either lower (3) or higher (4) expression values. xgboost was used to choose one of these four models using a manually labeled sample as training data. In order to correct flipped peaks, another round of manual labeling was performed with summaries displayed from the first round for the same cell/treatment. As for CMAP drug signatures above, surrogate variable were accounted for and moderated unbiased standardised effect sizes were calculted.
The final drug signatures are available in the ccdata package.
# load drug signatures
data(l1000_es)Cosine similarity is calculated between the query and drug signatures.
top_cmap  <- query_drugs(query_sig, cmap_es)
top_l1000 <- query_drugs(query_sig, l1000_es)
# LY-294002 best match among 1309 cmap signatures
# other PI3K inhibitors are also identified among top matching drugs
head(top_cmap, 4)##  LY-294002  sirolimus   benzamil wortmannin 
##  0.6949534  0.5641091  0.5428651  0.5385565# LY-294002 matches 4 of top 10 l1000 signatures (230,829 total) 
# other PI3K inhibitors are also identified among top matching drugs
head(top_l1000, 4)## TG-101348_MCF7_10um_24h LY-294002_HT29_10um_24h  LY-294002_MCF7_10um_6h 
##               0.6138769               0.6088132               0.6078368 
## LY-294002_MCF7_10um_24h 
##               0.6031555Note that only a subset of the cmap genes were measured in the l1000 signatures. As such, only common genes should be included if you wish to directly compare cmap and l1000 queries. To do this:
# remove genes in cmap_es that are not measured in l1000_es
cmap_lm <- cmap_es[row.names(l1000_es), ]
# query using genes common to cmap_es and l1000_es
top_cmap_lm  <- query_drugs(query_sig, cmap_lm)To more closely mimic or reverse a gene expression signature, drug combinations may be promising. For the 1309 drugs in the Connectivity Map build 2, there are 856086 unique two-drug combinations. It is currently unfeasable to assay all these combinations, but their expression profiles can be predicted.
In order to do so, I collected microarray data from GEO where single treatments and their combinations were assayed. In total, 148 studies with 257 treatment combinations were obtained.
Remarkably, simply averaging the expression profiles from the single treatments predicted the direction of differential expression of the combined treatment with 78.96% accuracy. The average expression profiles for all 856086 unique two-drug cmap combinations can be generated and queried as follows:
# query all 856086 combinations (takes ~2 minutes on Intel Core i7-6700)
# top_combos <- query_combos(query_sig, cmap_es)
# query only combinations with LY-294002
top_combos <- query_combos(query_sig, cmap_es, include='LY-294002', ncores=1)Combinations of l1000 signatures can also be queried using the average method. As ~26 billion two-perturbagen combinations are possible, queries should be limited to combinations with the top few perturbagens. For example:
# query only combinations with LY-294002_NKDBA_10um_24h
top_combos <- query_combos(query_sig, l1000_es, include='LY-294002_NKDBA_10um_24h', ncores=1)
# query combinations with all LY-294002 signatures
# top_combos <- query_combos(query_sig, l1000_es, include='LY-294002')A small improvement to 80.18% acurracy was obtained using machine learning models. To use these models requires 8-10GB of RAM and about 2 hours (Intel Core i7-6700 with the MRO+MKL distribution of R) to predict and query all 856086 unique two-drug cmap combinations. In practice, the drug combinations that most closely mimic or reverse a query signature usually include the top few single drugs. By only predicting drug combinations that include the top few single drugs, prediction times are greatly reduced:
# Times on Intel Core i7-6700 with MRO+MKL
# requires ~8-10GB of RAM
method  <- 'ml'
include <- names(head(top_cmap))
# query all 856086 combinations (~2 hours)
# top_combos <- query_combos(query_sig, 'cmap', method)
# query combinations with top single drugs (~1 minute)
# top_combos <- query_combos(query_sig, 'cmap', method, include)
sessionInfo()## R version 3.4.0 (2017-04-21)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 16.04.2 LTS
## 
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.5-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.5-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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] ccdata_1.1.3    limma_3.32.0    lydata_1.1.1    ccmap_1.2.0    
## [5] crossmeta_1.2.0
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_0.12.10         lattice_0.20-35      tidyr_0.6.1         
##  [4] assertthat_0.2.0     rprojroot_1.2        digest_0.6.12       
##  [7] foreach_1.4.3        mime_0.5             lsa_0.73.1          
## [10] R6_2.2.0             plyr_1.8.4           backports_1.0.5     
## [13] stats4_3.4.0         RSQLite_1.1-2        evaluate_0.10       
## [16] httr_1.2.1           ggplot2_2.2.1        BiocInstaller_1.26.0
## [19] lazyeval_0.2.0       data.table_1.10.4    miniUI_0.1.1        
## [22] S4Vectors_0.14.0     Matrix_1.2-9         rmarkdown_1.4       
## [25] stringr_1.2.0        htmlwidgets_0.8      munsell_0.4.3       
## [28] shiny_1.0.2          compiler_3.4.0       httpuv_1.3.3        
## [31] BiocGenerics_0.22.0  base64enc_0.1-3      metaMA_3.1.2        
## [34] pkgmaker_0.22        htmltools_0.3.5      tibble_1.3.0        
## [37] IRanges_2.10.0       codetools_0.2-15     viridisLite_0.2.0   
## [40] dplyr_0.5.0          SnowballC_0.5.1      grid_3.4.0          
## [43] jsonlite_1.4         xtable_1.8-2         gtable_0.2.0        
## [46] registry_0.3         DBI_0.6-1            magrittr_1.5        
## [49] scales_0.4.1         stringi_1.1.5        doRNG_1.6.6         
## [52] doParallel_1.0.10    fdrtool_1.2.15       xgboost_0.6-4       
## [55] iterators_1.0.8      tools_3.4.0          Biobase_2.36.0      
## [58] SMVar_1.3.3          purrr_0.2.2          rngtools_1.2.4      
## [61] parallel_3.4.0       yaml_2.1.14          AnnotationDbi_1.38.0
## [64] colorspace_1.3-2     memoise_1.1.0        plotly_4.5.6        
## [67] knitr_1.15.1