Contents

1 Overview

The iSEE package (Rue-Albrecht et al. 2018) provides a general and flexible framework for interactively exploring SummarizedExperiment objects. However, in many cases, more specialized panels are required for effective visualization of specific data types. The iSEEhex package implements panels summarising data points in hexagonal bins, that work directly in the iSEE application and can smoothly interact with other panels.

We first load in the package:

library(iSEEhex)

All the panels described in this document can be deployed by simply passing them into the iSEE() function via the initial= argument, as shown in the following examples.

1.1 Example

Let us prepare an example SingleCellExperiment object.

library(scRNAseq)

# Example data ----
sce <- ReprocessedAllenData(assays="tophat_counts")
class(sce)
## [1] "SingleCellExperiment"
## attr(,"package")
## [1] "SingleCellExperiment"
library(scater)
sce <- logNormCounts(sce, exprs_values="tophat_counts")

sce <- runPCA(sce, ncomponents=4)
sce <- runTSNE(sce)
rowData(sce)$ave_count <- rowMeans(assay(sce, "tophat_counts"))
rowData(sce)$n_cells <- rowSums(assay(sce, "tophat_counts") > 0)
sce
## class: SingleCellExperiment 
## dim: 20816 379 
## metadata(2): SuppInfo which_qc
## assays(2): tophat_counts logcounts
## rownames(20816): 0610007P14Rik 0610009B22Rik ... Zzef1 Zzz3
## rowData names(2): ave_count n_cells
## colnames(379): SRR2140028 SRR2140022 ... SRR2139341 SRR2139336
## colData names(23): NREADS NALIGNED ... passes_qc_checks_s sizeFactor
## reducedDimNames(2): PCA TSNE
## mainExpName: endogenous
## altExpNames(1): ERCC

Then, we create an iSEE app that compares the ReducedDimensionHexPlot panel – defined in this package – to the standard ReducedDimensionPlot defined in the iSEE package.

initialPanels <- list(
    ReducedDimensionPlot(
        ColorBy = "Feature name", ColorByFeatureName = "Cux2", PanelWidth = 6L),
    ReducedDimensionHexPlot(
        ColorBy = "Feature name", ColorByFeatureName = "Cux2", PanelWidth = 6L,
        BinResolution = 30)
)
app <- iSEE(se = sce, initial = initialPanels)

1.2 Further reading

Where can I find a comprehensive introduction to iSEE?

The iSEE package contains several vignettes detailing the main functionality. You can also take a look at this workshop. A compiled version from the Bioc2019 conference (based on Bioconductor release 3.10) is available here.

Session information

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] scater_1.30.0               ggplot2_3.4.4              
##  [3] scuttle_1.12.0              scRNAseq_2.15.0            
##  [5] iSEEhex_1.4.0               iSEE_2.14.0                
##  [7] SingleCellExperiment_1.24.0 SummarizedExperiment_1.32.0
##  [9] Biobase_2.62.0              GenomicRanges_1.54.0       
## [11] GenomeInfoDb_1.38.0         IRanges_2.36.0             
## [13] S4Vectors_0.40.0            BiocGenerics_0.48.0        
## [15] MatrixGenerics_1.14.0       matrixStats_1.0.0          
## [17] BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##   [1] splines_4.3.1                 later_1.3.1                  
##   [3] BiocIO_1.12.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.22-5               
##  [11] ensembldb_2.26.0              magrittr_2.0.3               
##  [13] sass_0.4.7                    rmarkdown_2.25               
##  [15] jquerylib_0.1.4               yaml_2.3.7                   
##  [17] httpuv_1.6.12                 DBI_1.1.3                    
##  [19] RColorBrewer_1.1-3            abind_1.4-5                  
##  [21] zlibbioc_1.48.0               Rtsne_0.16                   
##  [23] purrr_1.0.2                   AnnotationFilter_1.26.0      
##  [25] RCurl_1.98-1.12               rappdirs_0.3.3               
##  [27] circlize_0.4.15               GenomeInfoDbData_1.2.11      
##  [29] ggrepel_0.9.4                 irlba_2.3.5.1                
##  [31] DelayedMatrixStats_1.24.0     codetools_0.2-19             
##  [33] DelayedArray_0.28.0           DT_0.30                      
##  [35] xml2_1.3.5                    tidyselect_1.2.0             
##  [37] shape_1.4.6                   ScaledMatrix_1.10.0          
##  [39] viridis_0.6.4                 shinyWidgets_0.8.0           
##  [41] BiocFileCache_2.10.0          GenomicAlignments_1.38.0     
##  [43] jsonlite_1.8.7                GetoptLong_1.0.5             
##  [45] BiocNeighbors_1.20.0          ellipsis_0.3.2               
##  [47] iterators_1.0.14              foreach_1.5.2                
##  [49] tools_4.3.1                   progress_1.2.2               
##  [51] Rcpp_1.0.11                   glue_1.6.2                   
##  [53] gridExtra_2.3                 SparseArray_1.2.0            
##  [55] xfun_0.40                     mgcv_1.9-0                   
##  [57] dplyr_1.1.3                   shinydashboard_0.7.2         
##  [59] withr_2.5.1                   BiocManager_1.30.22          
##  [61] fastmap_1.1.1                 fansi_1.0.5                  
##  [63] shinyjs_2.1.0                 digest_0.6.33                
##  [65] rsvd_1.0.5                    R6_2.5.1                     
##  [67] mime_0.12                     colorspace_2.1-0             
##  [69] biomaRt_2.58.0                RSQLite_2.3.1                
##  [71] utf8_1.2.4                    generics_0.1.3               
##  [73] hexbin_1.28.3                 rtracklayer_1.62.0           
##  [75] prettyunits_1.2.0             httr_1.4.7                   
##  [77] htmlwidgets_1.6.2             S4Arrays_1.2.0               
##  [79] pkgconfig_2.0.3               gtable_0.3.4                 
##  [81] blob_1.2.4                    ComplexHeatmap_2.18.0        
##  [83] XVector_0.42.0                htmltools_0.5.6.1            
##  [85] bookdown_0.36                 ProtGenerics_1.34.0          
##  [87] rintrojs_0.3.2                clue_0.3-65                  
##  [89] scales_1.2.1                  png_0.1-8                    
##  [91] knitr_1.44                    rjson_0.2.21                 
##  [93] nlme_3.1-163                  curl_5.1.0                   
##  [95] shinyAce_0.4.2                cachem_1.0.8                 
##  [97] GlobalOptions_0.1.2           stringr_1.5.0                
##  [99] BiocVersion_3.18.0            parallel_4.3.1               
## [101] miniUI_0.1.1.1                vipor_0.4.5                  
## [103] AnnotationDbi_1.64.0          restfulr_0.0.15              
## [105] pillar_1.9.0                  grid_4.3.1                   
## [107] vctrs_0.6.4                   promises_1.2.1               
## [109] BiocSingular_1.18.0           dbplyr_2.3.4                 
## [111] beachmat_2.18.0               xtable_1.8-4                 
## [113] cluster_2.1.4                 beeswarm_0.4.0               
## [115] evaluate_0.22                 GenomicFeatures_1.54.0       
## [117] cli_3.6.1                     compiler_4.3.1               
## [119] Rsamtools_2.18.0              rlang_1.1.1                  
## [121] crayon_1.5.2                  ggbeeswarm_0.7.2             
## [123] stringi_1.7.12                viridisLite_0.4.2            
## [125] BiocParallel_1.36.0           munsell_0.5.0                
## [127] Biostrings_2.70.0             lazyeval_0.2.2               
## [129] colourpicker_1.3.0            Matrix_1.6-1.1               
## [131] ExperimentHub_2.10.0          hms_1.1.3                    
## [133] sparseMatrixStats_1.14.0      bit64_4.0.5                  
## [135] KEGGREST_1.42.0               shiny_1.7.5.1                
## [137] interactiveDisplayBase_1.40.0 AnnotationHub_3.10.0         
## [139] fontawesome_0.5.2             igraph_1.5.1                 
## [141] memoise_2.0.1                 bslib_0.5.1                  
## [143] bit_4.0.5

References

Rue-Albrecht, Kevin, Federico Marini, Charlotte Soneson, and Aaron T. L. Lun. 2018. “ISEE: Interactive Summarizedexperiment Explorer.” F1000Research 7 (June): 741. https://doi.org/10.12688/f1000research.14966.1.