spicyR 1.4.0
if (!require("BiocManager"))
    install.packages("BiocManager")
BiocManager::install("spicyR")# load required packages
library(spicyR)
library(lisaClust)
library(ggplot2)Clustering local indicators of spatial association (LISA) functions is a
methodology for identifying consistent spatial organisation of multiple
cell-types in an unsupervised way. This can be used to enable the
characterization of interactions between multiple cell-types simultaneously and
can complement traditional pairwise analysis. In our implementation our LISA
curves are a localised summary of an L-function from a Poisson point process
model. Our framework lisaClust can be used to provide a high-level summary
of cell-type colocalization in high-parameter spatial cytometry data,
facilitating the identification of distinct tissue compartments or
identification of complex cellular microenvironments.
TO illustrate our lisaClust framework, here we consider a very simple toy
example where two cell-types are completely separated spatially. We simulate
data for two different images.
set.seed(51773)
x <- round(c(runif(200),runif(200)+1,runif(200)+2,runif(200)+3,
           runif(200)+3,runif(200)+2,runif(200)+1,runif(200)),4)*100
y <- round(c(runif(200),runif(200)+1,runif(200)+2,runif(200)+3,
             runif(200),runif(200)+1,runif(200)+2,runif(200)+3),4)*100
cellType <- factor(paste('c',rep(rep(c(1:2),rep(200,2)),4),sep = ''))
imageID <- rep(c('s1', 's2'),c(800,800))
cells <- data.frame(x, y, cellType, imageID)
ggplot(cells, aes(x,y, colour = cellType)) + geom_point() + facet_wrap(~imageID)First we store our data in a SegmentedCells object.
cellExp <- SegmentedCells(cells, cellTypeString = 'cellType')
We can then calculate local indicators of spatial association (LISA) functions
using the lisa function. Here the LISA curves are a
localised summary of an L-function from a Poisson point process model. The radii
that will be calculated over can be set with Rs.
lisaCurves <- lisa(cellExp, Rs = c(20, 50, 100))The LISA curves can then be used to cluster the cells. Here we use k-means
clustering, other clustering methods like SOM could be used. We can store these
cell clusters or cell “regions” in our SegmentedCells object using the
region() <- function.
kM <- kmeans(lisaCurves,2)
region(cellExp) <- paste('region',kM$cluster,sep = '_')The hatchingPlot function can be used to construct a ggplot object where the
regions are marked by different hatching patterns. This allows us to plot both
regions and cell-types on the same visualization.
hatchingPlot(cellExp, imageID = c('s1','s2'))We could also create this plot using geom_hatching and scale_region_manual.
df <- region(cellExp, annot = TRUE)
p <- ggplot(df,aes(x = x,y = y, colour = cellType, region = region)) + 
  geom_point() + 
  facet_wrap(~imageID) +
  geom_hatching(window = "concave", 
                line.spacing = 11, 
                nbp = 50, 
                line.width = 2, 
                hatching.colour = "gray20",
                window.length = 0.1) +
  theme_minimal() + 
  scale_region_manual(values = 6:7, labels = c('ab','cd'))
pHere we apply our lisaClust framework to three images of pancreatic islets
from A Map of Human Type 1 Diabetes Progression by Imaging Mass Cytometry by
Damond et al. (2019).
We will start by reading in the data and storing it as a SegmentedCells
object. Here the data is in a format consistent with that outputted by
CellProfiler.
isletFile <- system.file("extdata","isletCells.txt.gz", package = "spicyR")
cells <- read.table(isletFile, header = TRUE)
cellExp <- SegmentedCells(cells, cellProfiler = TRUE)This data does not include annotation of the cell-types of each cell. Here we
extract the marker intensities from the SegmentedCells object using
cellMarks. We then perform k-means clustering with eight clusters and store
these cell-type clusters in our SegmentedCells object using cellType() <-.
markers <- cellMarks(cellExp)
kM <- kmeans(markers,10)
cellType(cellExp) <- paste('cluster', kM$cluster, sep = '')As before, we can calculate local indicators of spatial association (LISA)
functions using the lisa function.
lisaCurves <- lisa(cellExp, Rs = c(10,20,50))The LISA curves can then be used to cluster the cells. Here we use k-means
clustering to cluster the cells into two microenvironments.
We can store these cell clusters or cell “regions” in our SegmentedCells
object using the region() <- function.
kM <- kmeans(lisaCurves,2)
region(cellExp) <- paste('region',kM$cluster,sep = '_')Finally, we can use hatchingPlot to construct a ggplot object where the
regions are marked by different hatching patterns. This allows us to visualize
the two regions and ten cell-types simultaneously.
hatchingPlot(cellExp)sessionInfo()
## R version 4.1.0 (2021-05-18)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.2 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.13-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.13-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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] ggplot2_3.3.3    lisaClust_1.0.0  spicyR_1.4.0     BiocStyle_2.20.0
## 
## loaded via a namespace (and not attached):
##  [1] sass_0.4.0            tidyr_1.1.3           jsonlite_1.7.2       
##  [4] splines_4.1.0         bslib_0.2.5.1         assertthat_0.2.1     
##  [7] highr_0.9             BiocManager_1.30.15   stats4_4.1.0         
## [10] spatstat.geom_2.1-0   yaml_2.2.1            numDeriv_2016.8-1.1  
## [13] pillar_1.6.1          lattice_0.20-44       glue_1.4.2           
## [16] digest_0.6.27         RColorBrewer_1.1-2    polyclip_1.10-0      
## [19] minqa_1.2.4           colorspace_2.0-1      htmltools_0.5.1.1    
## [22] Matrix_1.3-3          spatstat.sparse_2.0-0 pkgconfig_2.0.3      
## [25] pheatmap_1.0.12       magick_2.7.2          bookdown_0.22        
## [28] fftwtools_0.9-11      purrr_0.3.4           spatstat.core_2.1-2  
## [31] scales_1.1.1          tensor_1.5            spatstat.utils_2.1-0 
## [34] BiocParallel_1.26.0   lme4_1.1-27           tibble_3.1.2         
## [37] mgcv_1.8-35           farver_2.1.0          generics_0.1.0       
## [40] IRanges_2.26.0        ellipsis_0.3.2        withr_2.4.2          
## [43] BiocGenerics_0.38.0   magrittr_2.0.1        crayon_1.4.1         
## [46] deldir_0.2-10         evaluate_0.14         fansi_0.4.2          
## [49] nlme_3.1-152          MASS_7.3-54           class_7.3-19         
## [52] tools_4.1.0           data.table_1.14.0     lifecycle_1.0.0      
## [55] stringr_1.4.0         V8_3.4.2              S4Vectors_0.30.0     
## [58] munsell_0.5.0         compiler_4.1.0        jquerylib_0.1.4      
## [61] concaveman_1.1.0      rlang_0.4.11          grid_4.1.0           
## [64] nloptr_1.2.2.2        goftest_1.2-2         labeling_0.4.2       
## [67] rmarkdown_2.8         boot_1.3-28           gtable_0.3.0         
## [70] lmerTest_3.1-3        curl_4.3.1            abind_1.4-5          
## [73] DBI_1.1.1             R6_2.5.0              knitr_1.33           
## [76] dplyr_1.0.6           utf8_1.2.1            stringi_1.6.2        
## [79] spatstat.data_2.1-0   parallel_4.1.0        Rcpp_1.0.6           
## [82] vctrs_0.3.8           rpart_4.1-15          tidyselect_1.1.1     
## [85] xfun_0.23