ExperimentColorMap classiSEE 2.12.0
Compiled date: 2023-04-25
Last edited: 2018-03-08
License: MIT + file LICENSE
iSEE coordinates the coloration in every plot via the ExperimentColorMap class (Rue-Albrecht et al. 2018).
Colors for samples or features are defined from column or row metadata or assay values using “colormaps”.
Each colormap is a function that takes a single integer argument and returns that number of distinct colors.
The ExperimentColorMap is a container that stores these functions for use within the iSEE() function.
Users can define their own colormaps to customize coloration for specific assays or covariates.
For continuous variables, the function will be asked to generate a number of colors (21, by default).
Interpolation will then be performed internally to generate a color gradient.
Users can use existing color scales like viridis::viridis or heat.colors:
# Coloring for log-counts:
logcounts_color_fun <- viridis::viridisIt is also possible to use a function that completely ignores any arguments, and simply returns a fixed number of interpolation points:
# Coloring for FPKMs:
fpkm_color_fun <- function(n){
    c("black","brown","red","orange","yellow")
}For categorical variables, the function should accept the number of levels and return a color per level. Colors are automatically assigned to factor levels in the specified order of the levels.
# Coloring for the 'driver' metadata variable.
driver_color_fun <- function(n){
    RColorBrewer::brewer.pal(n, "Set2")
}Alternatively, the function can ignore its arguments and simply return a named vector of colors if users want to specify the color for each level explicitly
It is the user’s responsibility to ensure that all levels are accounted for1 Needless to say, these functions should not be used as shared or global colormaps..
For instance, the following colormap function will only be compatible with factors of two levels, namely "Y" and "N":
# Coloring for the QC metadata variable:
qc_color_fun <- function(n){
    qc_colors <- c("forestgreen", "firebrick1")
    names(qc_colors) <- c("Y", "N")
    qc_colors
}When queried for a specific colormap of any type (assay, column data, or row data), the following process takes place:
ExperimentColorMap.ExperimentColorMap will revert to the default colormaps.By default, viridis is used as the default continuous colormap, and hcl is used as the default categorical colormap.
ExperimentColorMapWe store the set of colormap functions in an instance of the ExperimentColorMap class.
Named functions passed as assays, colData, or rowData arguments will be used for coloring data in those slots, respectively.
library(iSEE)
ecm <- ExperimentColorMap(
    assays = list(
        counts = heat.colors,
        logcounts = logcounts_color_fun,
        cufflinks_fpkm = fpkm_color_fun
    ),
    colData = list(
        passes_qc_checks_s = qc_color_fun,
        driver_1_s = driver_color_fun
    ),
    all_continuous = list(
        assays = viridis::plasma
    )
)
ecm
#> Class: ExperimentColorMap
#> assays(3): counts logcounts cufflinks_fpkm
#> colData(2): passes_qc_checks_s driver_1_s
#> rowData(0):
#> all_discrete(0):
#> all_continuous(1): assaysUsers can change the defaults for all assays or column data by modifying the shared colormaps. Similarly, users can modify the defaults for all continuous or categorical data by modifying the global colormaps. This is demonstrated below for the continuous variables:
ExperimentColorMap(
    all_continuous=list( # shared
        assays=viridis::plasma,
        colData=viridis::inferno
    ),
    global_continuous=viridis::magma # global
)
#> Class: ExperimentColorMap
#> assays(0):
#> colData(0):
#> rowData(0):
#> all_discrete(0):
#> all_continuous(2): assays colData
#> global_continuous(1)The ExperimentColorMap class offers the following major features:
colDataColorMap(colormap, "coldata_name") and setters assayColorMap(colormap, "assay_name") <- colormap_functionassays, colData, rowData), or shared globally between all categorical or continuous data scales.Detailed examples on the use of ExperimentColorMap objects are available in the documentation ?ExperimentColorMap, as well as below.
Here, we use the allen single-cell RNA-seq data set to demonstrate the use of the ExperimentColorMap class.
Using the sce object that we created previously, we create an iSEE app with the SingleCellExperiment object and the colormap generated above.
app <- iSEE(sce, colormap = ecm)We run this using runApp to open the app on our browser.
shiny::runApp(app)Now, choose to color cells by Column data and select passes_qc_checks_s.
We will see that all cells that passed QC (Y) are colored “forestgreen”, while the ones that didn’t pass are colored firebrick.
If we color any plot by gene expression, we see that use of counts follows the heat.colors coloring scheme;
use of log-counts follows the viridis coloring scheme;
and use of FPKMs follows the black-to-yellow scheme we defined in fpkm_color_fun.
sessionInfo()
#> R version 4.3.0 RC (2023-04-13 r84269)
#> Platform: x86_64-pc-linux-gnu (64-bit)
#> Running under: Ubuntu 22.04.2 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.17-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] TENxPBMCData_1.17.0         HDF5Array_1.28.0           
#>  [3] rhdf5_2.44.0                DelayedArray_0.26.0        
#>  [5] Matrix_1.5-4                scater_1.28.0              
#>  [7] ggplot2_3.4.2               scuttle_1.10.0             
#>  [9] scRNAseq_2.13.0             iSEE_2.12.0                
#> [11] SingleCellExperiment_1.22.0 SummarizedExperiment_1.30.0
#> [13] Biobase_2.60.0              GenomicRanges_1.52.0       
#> [15] GenomeInfoDb_1.36.0         IRanges_2.34.0             
#> [17] S4Vectors_0.38.0            BiocGenerics_0.46.0        
#> [19] MatrixGenerics_1.12.0       matrixStats_0.63.0         
#> [21] BiocStyle_2.28.0           
#> 
#> loaded via a namespace (and not attached):
#>   [1] splines_4.3.0                 later_1.3.0                  
#>   [3] BiocIO_1.10.0                 bitops_1.0-7                 
#>   [5] filelock_1.0.2                tibble_3.2.1                 
#>   [7] XML_3.99-0.14                 lifecycle_1.0.3              
#>   [9] doParallel_1.0.17             lattice_0.21-8               
#>  [11] ensembldb_2.24.0              magrittr_2.0.3               
#>  [13] sass_0.4.5                    rmarkdown_2.21               
#>  [15] jquerylib_0.1.4               yaml_2.3.7                   
#>  [17] httpuv_1.6.9                  DBI_1.1.3                    
#>  [19] RColorBrewer_1.1-3            zlibbioc_1.46.0              
#>  [21] Rtsne_0.16                    purrr_1.0.1                  
#>  [23] AnnotationFilter_1.24.0       RCurl_1.98-1.12              
#>  [25] rappdirs_0.3.3                circlize_0.4.15              
#>  [27] GenomeInfoDbData_1.2.10       ggrepel_0.9.3                
#>  [29] irlba_2.3.5.1                 DelayedMatrixStats_1.22.0    
#>  [31] codetools_0.2-19              DT_0.27                      
#>  [33] xml2_1.3.3                    tidyselect_1.2.0             
#>  [35] shape_1.4.6                   ScaledMatrix_1.8.0           
#>  [37] viridis_0.6.2                 shinyWidgets_0.7.6           
#>  [39] BiocFileCache_2.8.0           GenomicAlignments_1.36.0     
#>  [41] jsonlite_1.8.4                GetoptLong_1.0.5             
#>  [43] BiocNeighbors_1.18.0          ellipsis_0.3.2               
#>  [45] iterators_1.0.14              foreach_1.5.2                
#>  [47] tools_4.3.0                   progress_1.2.2               
#>  [49] Rcpp_1.0.10                   glue_1.6.2                   
#>  [51] gridExtra_2.3                 xfun_0.39                    
#>  [53] mgcv_1.8-42                   dplyr_1.1.2                  
#>  [55] shinydashboard_0.7.2          withr_2.5.0                  
#>  [57] BiocManager_1.30.20           fastmap_1.1.1                
#>  [59] rhdf5filters_1.12.0           fansi_1.0.4                  
#>  [61] shinyjs_2.1.0                 digest_0.6.31                
#>  [63] rsvd_1.0.5                    R6_2.5.1                     
#>  [65] mime_0.12                     colorspace_2.1-0             
#>  [67] biomaRt_2.56.0                RSQLite_2.3.1                
#>  [69] utf8_1.2.3                    generics_0.1.3               
#>  [71] rtracklayer_1.60.0            prettyunits_1.1.1            
#>  [73] httr_1.4.5                    htmlwidgets_1.6.2            
#>  [75] pkgconfig_2.0.3               gtable_0.3.3                 
#>  [77] blob_1.2.4                    ComplexHeatmap_2.16.0        
#>  [79] XVector_0.40.0                htmltools_0.5.5              
#>  [81] bookdown_0.33                 ProtGenerics_1.32.0          
#>  [83] rintrojs_0.3.2                clue_0.3-64                  
#>  [85] scales_1.2.1                  png_0.1-8                    
#>  [87] knitr_1.42                    rjson_0.2.21                 
#>  [89] nlme_3.1-162                  curl_5.0.0                   
#>  [91] shinyAce_0.4.2                cachem_1.0.7                 
#>  [93] GlobalOptions_0.1.2           stringr_1.5.0                
#>  [95] BiocVersion_3.17.1            parallel_4.3.0               
#>  [97] miniUI_0.1.1.1                vipor_0.4.5                  
#>  [99] AnnotationDbi_1.62.0          restfulr_0.0.15              
#> [101] pillar_1.9.0                  grid_4.3.0                   
#> [103] vctrs_0.6.2                   promises_1.2.0.1             
#> [105] BiocSingular_1.16.0           dbplyr_2.3.2                 
#> [107] beachmat_2.16.0               xtable_1.8-4                 
#> [109] cluster_2.1.4                 beeswarm_0.4.0               
#> [111] evaluate_0.20                 GenomicFeatures_1.52.0       
#> [113] cli_3.6.1                     compiler_4.3.0               
#> [115] Rsamtools_2.16.0              rlang_1.1.0                  
#> [117] crayon_1.5.2                  ggbeeswarm_0.7.1             
#> [119] stringi_1.7.12                viridisLite_0.4.1            
#> [121] BiocParallel_1.34.0           munsell_0.5.0                
#> [123] Biostrings_2.68.0             lazyeval_0.2.2               
#> [125] colourpicker_1.2.0            ExperimentHub_2.8.0          
#> [127] hms_1.1.3                     sparseMatrixStats_1.12.0     
#> [129] bit64_4.0.5                   Rhdf5lib_1.22.0              
#> [131] KEGGREST_1.40.0               shiny_1.7.4                  
#> [133] interactiveDisplayBase_1.38.0 highr_0.10                   
#> [135] AnnotationHub_3.8.0           fontawesome_0.5.1            
#> [137] igraph_1.4.2                  memoise_2.0.1                
#> [139] bslib_0.4.2                   bit_4.0.5
# devtools::session_info()Rue-Albrecht, K., F. Marini, C. Soneson, and A. T. L. Lun. 2018. “ISEE: Interactive Summarizedexperiment Explorer.” F1000Research 7 (June): 741.