iSEEhex 1.0.0
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.
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): ERCCThen, 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)sessionInfo()## R version 4.2.1 (2022-06-23)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.16-bioc/R/lib/libRlapack.so
## 
## 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       
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] scater_1.26.0               ggplot2_3.3.6              
##  [3] scuttle_1.8.0               scRNAseq_2.11.0            
##  [5] iSEEhex_1.0.0               iSEE_2.10.0                
##  [7] SingleCellExperiment_1.20.0 SummarizedExperiment_1.28.0
##  [9] Biobase_2.58.0              GenomicRanges_1.50.0       
## [11] GenomeInfoDb_1.34.0         IRanges_2.32.0             
## [13] S4Vectors_0.36.0            BiocGenerics_0.44.0        
## [15] MatrixGenerics_1.10.0       matrixStats_0.62.0         
## [17] BiocStyle_2.26.0           
## 
## loaded via a namespace (and not attached):
##   [1] circlize_0.4.15               AnnotationHub_3.6.0          
##   [3] BiocFileCache_2.6.0           igraph_1.3.5                 
##   [5] lazyeval_0.2.2                shinydashboard_0.7.2         
##   [7] splines_4.2.1                 BiocParallel_1.32.0          
##   [9] digest_0.6.30                 ensembldb_2.22.0             
##  [11] foreach_1.5.2                 htmltools_0.5.3              
##  [13] viridis_0.6.2                 fansi_1.0.3                  
##  [15] magrittr_2.0.3                memoise_2.0.1                
##  [17] ScaledMatrix_1.6.0            cluster_2.1.4                
##  [19] doParallel_1.0.17             ComplexHeatmap_2.14.0        
##  [21] Biostrings_2.66.0             prettyunits_1.1.1            
##  [23] colorspace_2.0-3              blob_1.2.3                   
##  [25] rappdirs_0.3.3                ggrepel_0.9.1                
##  [27] xfun_0.34                     dplyr_1.0.10                 
##  [29] crayon_1.5.2                  RCurl_1.98-1.9               
##  [31] jsonlite_1.8.3                hexbin_1.28.2                
##  [33] iterators_1.0.14              glue_1.6.2                   
##  [35] gtable_0.3.1                  zlibbioc_1.44.0              
##  [37] XVector_0.38.0                GetoptLong_1.0.5             
##  [39] DelayedArray_0.24.0           BiocSingular_1.14.0          
##  [41] shape_1.4.6                   scales_1.2.1                 
##  [43] DBI_1.1.3                     miniUI_0.1.1.1               
##  [45] Rcpp_1.0.9                    viridisLite_0.4.1            
##  [47] xtable_1.8-4                  progress_1.2.2               
##  [49] clue_0.3-62                   rsvd_1.0.5                   
##  [51] bit_4.0.4                     DT_0.26                      
##  [53] htmlwidgets_1.5.4             httr_1.4.4                   
##  [55] RColorBrewer_1.1-3            shinyAce_0.4.2               
##  [57] ellipsis_0.3.2                pkgconfig_2.0.3              
##  [59] XML_3.99-0.12                 sass_0.4.2                   
##  [61] dbplyr_2.2.1                  utf8_1.2.2                   
##  [63] tidyselect_1.2.0              rlang_1.0.6                  
##  [65] later_1.3.0                   AnnotationDbi_1.60.0         
##  [67] munsell_0.5.0                 BiocVersion_3.16.0           
##  [69] tools_4.2.1                   cachem_1.0.6                 
##  [71] cli_3.4.1                     generics_0.1.3               
##  [73] RSQLite_2.2.18                ExperimentHub_2.6.0          
##  [75] rintrojs_0.3.2                evaluate_0.17                
##  [77] stringr_1.4.1                 fastmap_1.1.0                
##  [79] yaml_2.3.6                    knitr_1.40                   
##  [81] bit64_4.0.5                   purrr_0.3.5                  
##  [83] AnnotationFilter_1.22.0       KEGGREST_1.38.0              
##  [85] sparseMatrixStats_1.10.0      nlme_3.1-160                 
##  [87] mime_0.12                     xml2_1.3.3                   
##  [89] biomaRt_2.54.0                compiler_4.2.1               
##  [91] beeswarm_0.4.0                filelock_1.0.2               
##  [93] curl_4.3.3                    png_0.1-7                    
##  [95] interactiveDisplayBase_1.36.0 tibble_3.1.8                 
##  [97] bslib_0.4.0                   stringi_1.7.8                
##  [99] highr_0.9                     GenomicFeatures_1.50.0       
## [101] lattice_0.20-45               ProtGenerics_1.30.0          
## [103] Matrix_1.5-1                  shinyjs_2.1.0                
## [105] vctrs_0.5.0                   pillar_1.8.1                 
## [107] lifecycle_1.0.3               BiocManager_1.30.19          
## [109] jquerylib_0.1.4               GlobalOptions_0.1.2          
## [111] BiocNeighbors_1.16.0          irlba_2.3.5.1                
## [113] bitops_1.0-7                  rtracklayer_1.58.0           
## [115] httpuv_1.6.6                  BiocIO_1.8.0                 
## [117] R6_2.5.1                      bookdown_0.29                
## [119] promises_1.2.0.1              gridExtra_2.3                
## [121] vipor_0.4.5                   codetools_0.2-18             
## [123] colourpicker_1.2.0            assertthat_0.2.1             
## [125] fontawesome_0.4.0             rjson_0.2.21                 
## [127] withr_2.5.0                   shinyWidgets_0.7.4           
## [129] GenomicAlignments_1.34.0      Rsamtools_2.14.0             
## [131] GenomeInfoDbData_1.2.9        mgcv_1.8-41                  
## [133] parallel_4.2.1                hms_1.1.2                    
## [135] beachmat_2.14.0               grid_4.2.1                   
## [137] DelayedMatrixStats_1.20.0     rmarkdown_2.17               
## [139] Rtsne_0.16                    shiny_1.7.3                  
## [141] ggbeeswarm_0.6.0              restfulr_0.0.15Rue-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.