Contents

1 Getting started

The sechm package is a wrapper around the ComplexHeatmap package to facilitate the creation of annotated heatmaps from objects of the Bioconductor class SummarizedExperiment (and extensions thereof).

1.1 Package installation

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

1.2 Example data

To showcase the main functions, we will use an example object which contains (a subset of) RNAseq of mouse hippocampi after Forskolin-induced long-term potentiation:

suppressPackageStartupMessages({
  library(SummarizedExperiment)
  library(sechm)
})
data("Chen2017", package="sechm")
SE <- Chen2017

This is taken from Chen et al., 2017.

2 Example usage

2.1 Basic functionalities

The sechm function simplifies the generation of heatmaps from SummarizedExperiment. It minimally requires, as input, a SummarizedExperiment object and a set of genes (or features, i.e. rows of sechm) to plot:

g <- c("Egr1", "Nr4a1", "Fos", "Egr2", "Sgk1", "Arc", "Dusp1", "Fosb", "Sik1")
sechm(SE, features=g)
## Using assay 'logFC'

# with row scaling:
sechm(SE, features=g, do.scale=TRUE)
## Using assay 'logFC'

The assay can be selected, and any rowData or colData columns can be specified as annotation:

rowData(SE)$meanLogCPM <- rowMeans(assays(SE)$logcpm)
sechm(SE, features=g, assayName="logFC", top_annotation=c("Condition","Time"), left_annotation=c("meanLogCPM"))

Column names are ommitted by default, but can be displayed:

sechm(SE, features=g, do.scale=TRUE, show_colnames=TRUE)
## Using assay 'logFC'

Since sechm uses the ComplexHeatmap engine for plotting, any argument of ComplexHeatmap::Heatmap can be passed:

sechm(SE, features=g, do.scale=TRUE, row_title="My genes")
## Using assay 'logFC'

When plotting a lot of rows, by default row names are not shown (can be overriden), but specific genes can be highlighted with the mark argument:

sechm(SE, features=row.names(SE), mark=g, do.scale=TRUE, top_annotation=c("Condition","Time"))
## Using assay 'logFC'

We can also add gaps using the same columns:

sechm(SE, features=g, do.scale=TRUE, top_annotation="Time", gaps_at="Condition")
## Using assay 'logFC'

2.2 Row ordering

By default, rows are sorted using the MDS angle method (can be altered with the sort.method argument); this can be disabled with:

# reverts to clustering:
sechm(SE, features=row.names(SE), do.scale=TRUE, sortRowsOn=NULL)
## Using assay 'logFC'

# no reordering:
sechm(SE, features=row.names(SE), do.scale=TRUE, sortRowsOn=NULL, 
      cluster_rows=FALSE)
## Using assay 'logFC'

It is also possible to combine sorting with clusters using the toporder argument, or using gaps:.

# we first cluster rows, and save the clusters in the rowData:
rowData(SE)$cluster <- as.character(kmeans(t(scale(t(assay(SE)))),5)$cluster)
sechm(SE, features=1:30, do.scale=TRUE, toporder="cluster", 
      left_annotation="cluster", show_rownames=FALSE)
## Using assay 'logFC'

sechm(SE, features=1:30, do.scale=TRUE, gaps_row="cluster",
      show_rownames=FALSE)
## Using assay 'logFC'

2.3 Color scale

sechm tries to guess whether the data plotted are centered around zero, and adjusts the scale accordingly (this can be disable with breaks=FALSE). It also performs a quantile capping to avoid extreme values taking most of the color scale, which is especially relevant when plotting for instance fold-changes. This can be controlled with the breaks argument. Consider the three following examples:

library(ComplexHeatmap)
g2 <- c(g,"Gm14288",tail(row.names(SE)))
draw(
    sechm(SE, features=g2, assayName="logFC", breaks=1, column_title="breaks=1") + 
    sechm(SE, features=g2, assayName="logFC", breaks=0.995, 
          column_title="breaks=0.995", name="logFC(2)") + 
    sechm(SE, features=g2, assayName="logFC", breaks=0.985, 
          column_title="breaks=0.985", name="logFC(3)"),
    merge_legends=TRUE)

With breaks=1, the scale is made symmetric, but not quantile capping is performed. In this way, most of the colorscale is taken by the difference between one datapoint (first gene) and the rest, making it difficult to distinguish patterns in the genes at the bottom. Instead, with breaks=0.985, the color scale is linear up until the 0.985 quantile of the data, and ordinal after this. This reduces our capacity to distinguish variations between the extreme values, but enables us to visualize the others better.

Manual breaks can also be defined. The colors themselves can be passed as follows:

# not run
sechm(SE, features=g2, hmcols=viridisLite::cividis(10))

2.4 Annotation colors

Annotation colors can be passed with the anno_colors argument, but the simplest is to store them in the object’s metadata:

metadata(SE)$anno_colors
## $Time
##          30          60         120        <NA> 
## "#90EE90FF" "#65BE61FF" "#3A9034FF" "#006400FF" 
## 
## $Condition
##     Control   Forskolin 
## "lightgrey"   "Darkred"
metadata(SE)$anno_colors$Condition <- c(Control="white", Forskolin="black")
sechm(SE, features=g2, top_annotation="Condition")
## Using assay 'logFC'

Heatmap colors can be passed on in the same way:

metadata(SE)$hmcols <- c("darkred","white","darkblue")
sechm(SE, g, do.scale = TRUE)
## Using assay 'logFC'

The default assay to be displayed and the default annotation fields to show can be specified in the default_view metadata element, as follows:

metadata(SE)$default_view <- list(
  assay="logFC",
  top_annotation="Condition"
)

Finally, it is also possible to set colors as package-wide options:

setSechmOption("hmcols", value=c("white","grey","black"))
sechm(SE, g, do.scale = TRUE)

At the moment, the following arguments can be set as global options: assayName, hmcols, left_annotation, right_annotation, top_annotation, bottom_annotation, anno_colors, gaps_at, breaks.

To remove the predefined colors:

resetAllSechmOptions()
metadata(SE)$hmcols <- NULL
metadata(SE)$anno_colors <- NULL

In order of priority, the arguments in the function call trump the object’s metadata, which trumps the global options.

3 crossHm

Because sechm produces a Heatmap object from ComplexHeatmap, it is possible to combine them:

sechm(SE, features=g) + sechm(SE, features=g)
## Warning: Heatmap/annotation names are duplicated: logFC

However, doing so involves manual work to ensure that the labels and colors are nice and coherent, and that the rows names match. As a convenience, we provide the crossHm function to handle these issues. crossHm works with a list of SummarizedExperiment objects:

# we build another SE object and introduce some variation in it:
SE2 <- SE
assays(SE2)$logcpm <- jitter(assays(SE2)$logcpm, factor=1000)
crossHm(list(SE1=SE, SE2=SE2), g, do.scale = TRUE, 
        top_annotation=c("Condition","Time"))
## Using assay 'logFC'
## Using assay 'logFC'

Scaling is applied to the datasets separately. A unique color scale can be enforced:

crossHm(list(SE1=SE, SE2=SE2), g, do.scale = TRUE, 
        top_annotation=c("Condition","Time"), uniqueScale = TRUE)
## Using assay 'logFC'
## Using assay 'logFC'

4 Other convenience functions

The package also includes a number of other convenience functions which we briefly describe here (see the functions’ help for more information):



Session info

## 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] grid      stats4    stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
##  [1] sechm_1.10.0                ComplexHeatmap_2.18.0      
##  [3] SummarizedExperiment_1.32.0 Biobase_2.62.0             
##  [5] GenomicRanges_1.54.0        GenomeInfoDb_1.38.0        
##  [7] IRanges_2.36.0              S4Vectors_0.40.0           
##  [9] BiocGenerics_0.48.0         MatrixGenerics_1.14.0      
## [11] matrixStats_1.0.0           BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] circlize_0.4.15         shape_1.4.6             rjson_0.2.21           
##  [4] xfun_0.40               bslib_0.5.1             GlobalOptions_0.1.2    
##  [7] lattice_0.22-5          Cairo_1.6-1             tools_4.3.1            
## [10] bitops_1.0-7            curl_5.1.0              parallel_4.3.1         
## [13] ca_0.71.1               cluster_2.1.4           Matrix_1.6-1.1         
## [16] randomcoloR_1.1.0.1     RColorBrewer_1.1-3      lifecycle_1.0.3        
## [19] GenomeInfoDbData_1.2.11 compiler_4.3.1          stringr_1.5.0          
## [22] munsell_0.5.0           codetools_0.2-19        clue_0.3-65            
## [25] seriation_1.5.1         htmltools_0.5.6.1       sass_0.4.7             
## [28] RCurl_1.98-1.12         yaml_2.3.7              crayon_1.5.2           
## [31] jquerylib_0.1.4         DelayedArray_0.28.0     cachem_1.0.8           
## [34] magick_2.8.1            iterators_1.0.14        TSP_1.2-4              
## [37] abind_1.4-5             foreach_1.5.2           digest_0.6.33          
## [40] Rtsne_0.16              stringi_1.7.12          bookdown_0.36          
## [43] fastmap_1.1.1           colorspace_2.1-0        cli_3.6.1              
## [46] SparseArray_1.2.0       magrittr_2.0.3          S4Arrays_1.2.0         
## [49] scales_1.2.1            registry_0.5-1          rmarkdown_2.25         
## [52] XVector_0.42.0          png_0.1-8               GetoptLong_1.0.5       
## [55] evaluate_0.22           knitr_1.44              V8_4.4.0               
## [58] doParallel_1.0.17       rlang_1.1.1             Rcpp_1.0.11            
## [61] glue_1.6.2              BiocManager_1.30.22     jsonlite_1.8.7         
## [64] R6_2.5.1                zlibbioc_1.48.0