Gallery of mascarade-generaded masks

Loading necessary libraries

library(mascarade)
library(data.table)
library(ggplot2)
library(ggsci)

PBMC-3K UMAP

example <- readRDS(url("https://alserglab.wustl.edu/files/mascarade/examples/pbmc3k_umap.rds"))
data <- data.table(example$dims, 
                   cluster=example$clusters)

maskTable <- generateMask(dims=example$dims, 
                          clusters=example$clusters)

ggplot(data, aes(x=UMAP_1, y=UMAP_2)) + 
    geom_point(aes(color=cluster)) + 
    geom_path(data=maskTable, aes(group=group)) +
    coord_fixed() + 
    theme_classic()

PBMC-3K t-SNE

example <- readRDS(url("https://alserglab.wustl.edu/files/mascarade/examples/pbmc3k_tsne.rds"))
data <- data.table(example$dims, 
                   cluster=example$clusters)

maskTable <- generateMask(dims=example$dims, 
                          clusters=example$clusters)

ggplot(data, aes(x=tSNE_1, y=tSNE_2)) + 
    geom_point(aes(color=cluster)) + 
    geom_path(data=maskTable, aes(group=group)) +
    coord_fixed() + 
    theme_classic()

Aya

example <- readRDS(url("https://alserglab.wustl.edu/files/mascarade/examples/aya.rds"))
data <- data.table(example$dims, 
                   cluster=example$clusters)

maskTable <- generateMask(dims=example$dims, 
                          clusters=example$clusters)

ggplot(data, aes(x=UMAP_1, y=UMAP_2)) + 
    geom_point(aes(color=cluster), size=0.5) + 
    geom_path(data=maskTable, aes(group=group)) +
    coord_fixed() + 
    theme_classic()

Chia-Jung

example <- readRDS(url("https://alserglab.wustl.edu/files/mascarade/examples/chiajung1.rds"))
data <- data.table(example$dims, 
                   cluster=example$clusters)

maskTable <- generateMask(dims=example$dims, 
                          clusters=example$clusters)

ggplot(data, aes(x=UMAP_1, y=UMAP_2)) + 
    geom_point(aes(color=cluster), size=0.1) + 
    scale_color_ucscgb() +
    geom_path(data=maskTable, aes(group=group)) +
    coord_fixed() + 
    theme_classic()

example <- readRDS(url("https://alserglab.wustl.edu/files/mascarade/examples/chiajung2.rds"))
data <- data.table(example$dims, 
                   cluster=example$clusters)

maskTable <- generateMask(dims=example$dims, 
                          clusters=example$clusters)

ggplot(data, aes(x=UMAP_1, y=UMAP_2)) + 
    geom_point(aes(color=cluster)) + 
    geom_path(data=maskTable, aes(group=group)) +
    coord_fixed() + 
    theme_classic()

Session info

sessionInfo()
## R version 4.4.3 (2025-02-28)
## Platform: x86_64-pc-linux-gnu
## Running under: Debian GNU/Linux 12 (bookworm)
## 
## Matrix products: default
## BLAS:   /usr/lib/x86_64-linux-gnu/openblas-pthread/libblas.so.3 
## LAPACK: /usr/lib/x86_64-linux-gnu/openblas-pthread/libopenblasp-r0.3.21.so;  LAPACK version 3.11.0
## 
## locale:
##  [1] LC_CTYPE=C.utf8       LC_NUMERIC=C          LC_TIME=C.utf8       
##  [4] LC_COLLATE=C.utf8     LC_MONETARY=C.utf8    LC_MESSAGES=C.utf8   
##  [7] LC_PAPER=C.utf8       LC_NAME=C             LC_ADDRESS=C         
## [10] LC_TELEPHONE=C        LC_MEASUREMENT=C.utf8 LC_IDENTIFICATION=C  
## 
## time zone: US/Central
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] ggsci_3.2.0       ggplot2_3.5.1     data.table_1.16.4 mascarade_0.2.0  
## 
## loaded via a namespace (and not attached):
##  [1] Matrix_1.7-2           gtable_0.3.6           jsonlite_1.8.8        
##  [4] highr_0.11             dplyr_1.1.4            compiler_4.4.3        
##  [7] spatstat.utils_3.1-1   tidyselect_1.2.1       spatstat.sparse_3.1-0 
## [10] jquerylib_0.1.4        scales_1.3.0           yaml_2.3.9            
## [13] fastmap_1.2.0          spatstat.explore_3.3-3 lattice_0.22-6        
## [16] deldir_2.0-4           tensor_1.5             R6_2.5.1              
## [19] spatstat.univar_3.1-1  labeling_0.4.3         generics_0.1.3        
## [22] spatstat.geom_3.3-4    knitr_1.48             polyclip_1.10-7       
## [25] tibble_3.2.1           munsell_0.5.1          rprojroot_2.0.4       
## [28] pillar_1.10.0          bslib_0.7.0            rlang_1.1.4           
## [31] cachem_1.1.0           xfun_0.45              sass_0.4.9            
## [34] cli_3.6.3              withr_3.0.2            magrittr_2.0.3        
## [37] digest_0.6.36          grid_4.4.3             rstudioapi_0.16.0     
## [40] lifecycle_1.0.4        spatstat.random_3.3-2  nlme_3.1-167          
## [43] vctrs_0.6.5            evaluate_0.24.0        glue_1.8.0            
## [46] farver_2.1.2           goftest_1.2-3          abind_1.4-5           
## [49] colorspace_2.1-1       spatstat.data_3.1-4    rmarkdown_2.27        
## [52] pkgconfig_2.0.3        tools_4.4.3            htmltools_0.5.8.1