library(SPIAT)

1 Cellular neighborhood

The aggregation of cells can result in ‘cellular neighbourhoods’. A neighbourhood is defined as a group of cells that cluster together. These can be homotypic, containing cells of a single class (e.g. immune cells), or heterotypic (e.g. a mixture of tumour and immune cells).

Function identify_neighborhoods() identifies cellular neighbourhoods. Users can select a subset of cell types of interest if desired. SPIAT includes three algorithms for the detection of neighbourhoods.

  • Hierarchical Clustering algorithm: Euclidean distances between cells are calculated, and pairs of cells with a distance less than a specified radius are considered to be ‘interacting’, with the rest being ‘non-interacting’. Hierarchical clustering is then used to separate the clusters. Larger radii will result in the merging of individual clusters.
  • dbscan
  • phenograph

For Hierarchical Clustering algorithm and dbscan, users need to specify a radius that defines the distance for an interaction. We suggest users to test different radii and select the one that generates intuitive clusters upon visualisation. Cells not assigned to clusters are assigned as Cluster_NA in the output table. The argument min_neighborhood_size specifies the threshold of a neighborhood size to be considered as a neighborhood. Smaller neighbourhoods will be outputted, but will not be assigned a number.

Rphenograph uses the number of nearest neighbours to detect clusters. This number should be specified by min_neighborhood_size argument. We also encourage users to test different values.

For this part of the tutorial, we will use the image image_no_markers simulated with the spaSim package. This image contains “Tumour”, “Immune”, “Immune1” and “Immune2” cells without marker intensities.

data("image_no_markers")

plot_cell_categories(
  image_no_markers, c("Tumour", "Immune","Immune1","Immune2","Others"),
  c("red","blue","darkgreen", "brown","lightgray"), "Cell.Type")

Users are recommended to test out different radii and then visualise the clustering results. To aid in this process, users can use the average_minimum_distance() function, which calculates the average minimum distance between all cells in an image, and can be used as a starting point.

average_minimum_distance(image_no_markers)
## [1] 17.01336

We then identify the cellular neighbourhoods using our hierarchical algorithm with a radius of 50, and with a minimum neighbourhood size of 100. Cells assigned to neighbourhoods smaller than 100 will be assigned to the “Cluster_NA” neighbourhood.

clusters <- identify_neighborhoods(
  image_no_markers, method = "hierarchical", min_neighborhood_size = 100,
  cell_types_of_interest = c("Immune", "Immune1", "Immune2"), radius = 50, 
  feature_colname = "Cell.Type")

This plot shows clusters of “Immune”, “Immune1” and “Immune2” cells. Each number and colour corresponds to a distinct cluster. Black cells correspond to ‘free’, un-clustered cells.

We can visualise the cell composition of neighborhoods. To do this, we can use composition_of_neighborhoods() to obtain the percentages of cells with a specific marker within each neighborhood and the number of cells in the neighborhood.

In this example we select cellular neighbourhoods with at least 5 cells.

neighorhoods_vis <- 
  composition_of_neighborhoods(clusters, feature_colname = "Cell.Type")
neighorhoods_vis <- 
  neighorhoods_vis[neighorhoods_vis$Total_number_of_cells >=5,]

Finally, we can use plot_composition_heatmap() to produce a heatmap showing the marker percentages within each cluster, which can be used to classify the derived neighbourhoods.

plot_composition_heatmap(neighorhoods_vis, feature_colname="Cell.Type")

This plot shows that Cluster_1 and Cluster_2 contain all three types of immune cells. Cluster_3 does not have Immune1 cells. Cluster_1 and Cluster_2 are more similar to the free cells (cells not assigned to clusters) in their composition than Cluster_3.

2 Average Nearest Neighbour Index (ANNI)

We can test for the presence of neighbourhoods using ANNI. We can calculate the ANNI with the function average_nearest_neighbor_index(), which takes one cell type of interest (e.g. Cluster_1 under Neighborhood column of clusters object) or a combinations of cell types (e.g. Immune1 and Immune2 cells under Cell.Type column of image_no_markers object) and outputs whether there is a clear neighbourhood (clustered) or unclear (dispersed/random), along with a P value for the estimate.

Here show the examples for both one cell type and multiple cell types.

average_nearest_neighbor_index(clusters, reference_celltypes=c("Cluster_1"), 
                               feature_colname="Neighborhood", p_val = 0.05)
## $ANN_index
## [1] 0.4696608
## 
## $pattern
## [1] "Clustered"
## 
## $`p-value`
## [1] 2.623132e-68
average_nearest_neighbor_index(
  image_no_markers, reference_celltypes=c("Immune", "Immune1" , "Immune2"), 
  feature_colname="Cell.Type", p_val = 0.05)
## $ANN_index
## [1] 0.9968575
## 
## $pattern
## [1] "Random"
## 
## $`p-value`
## [1] 0.4000806

p_val is the cutoff to determine if a pattern is significant or not. If the p value of ANNI is larger than the threshold, the pattern will be “Random”. Although we give a default p value cutoff of 5e-6, we suggest the users to define their own cutoff based on the images and how they define the patterns “Clustered” and “Dispersed”.

4 Reproducibility

sessionInfo()
## R Under development (unstable) (2024-03-18 r86148)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 22.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.19-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] SPIAT_1.5.3                 SpatialExperiment_1.13.1   
##  [3] SingleCellExperiment_1.25.0 SummarizedExperiment_1.33.3
##  [5] Biobase_2.63.0              GenomicRanges_1.55.4       
##  [7] GenomeInfoDb_1.39.9         IRanges_2.37.1             
##  [9] S4Vectors_0.41.5            BiocGenerics_0.49.1        
## [11] MatrixGenerics_1.15.0       matrixStats_1.2.0          
## [13] BiocStyle_2.31.0           
## 
## loaded via a namespace (and not attached):
##   [1] deldir_2.0-4            gridExtra_2.3           rlang_1.1.3            
##   [4] magrittr_2.0.3          clue_0.3-65             GetoptLong_1.0.5       
##   [7] ggridges_0.5.6          compiler_4.4.0          spatstat.geom_3.2-9    
##  [10] png_0.1-8               vctrs_0.6.5             reshape2_1.4.4         
##  [13] stringr_1.5.1           shape_1.4.6.1           pkgconfig_2.0.3        
##  [16] crayon_1.5.2            fastmap_1.1.1           magick_2.8.3           
##  [19] XVector_0.43.1          labeling_0.4.3          utf8_1.2.4             
##  [22] rmarkdown_2.26          tzdb_0.4.0              pracma_2.4.4           
##  [25] bit_4.0.5               xfun_0.42               zlibbioc_1.49.3        
##  [28] cachem_1.0.8            jsonlite_1.8.8          goftest_1.2-3          
##  [31] highr_0.10              DelayedArray_0.29.9     spatstat.utils_3.0-4   
##  [34] cluster_2.1.6           parallel_4.4.0          R6_2.5.1               
##  [37] RColorBrewer_1.1-3      bslib_0.6.1             stringi_1.8.3          
##  [40] spatstat.data_3.0-4     jquerylib_0.1.4         iterators_1.0.14       
##  [43] Rcpp_1.0.12             bookdown_0.38           knitr_1.45             
##  [46] tensor_1.5              Matrix_1.6-5            tidyselect_1.2.1       
##  [49] abind_1.4-5             yaml_2.3.8              codetools_0.2-19       
##  [52] doParallel_1.0.17       spatstat.random_3.2-3   spatstat.explore_3.2-6 
##  [55] lattice_0.22-6          tibble_3.2.1            plyr_1.8.9             
##  [58] withr_3.0.0             evaluate_0.23           archive_1.1.7          
##  [61] polyclip_1.10-6         circlize_0.4.16         pillar_1.9.0           
##  [64] BiocManager_1.30.22     foreach_1.5.2           generics_0.1.3         
##  [67] dbscan_1.1-12           vroom_1.6.5             ggplot2_3.5.0          
##  [70] munsell_0.5.0           scales_1.3.0            gtools_3.9.5           
##  [73] apcluster_1.4.11        glue_1.7.0              pheatmap_1.0.12        
##  [76] tools_4.4.0             dittoSeq_1.15.6         RANN_2.6.1             
##  [79] Cairo_1.6-2             cowplot_1.1.3           grid_4.4.0             
##  [82] colorspace_2.1-0        nlme_3.1-164            GenomeInfoDbData_1.2.11
##  [85] mmand_1.6.3             cli_3.6.2               spatstat.sparse_3.0-3  
##  [88] fansi_1.0.6             S4Arrays_1.3.6          viridisLite_0.4.2      
##  [91] ComplexHeatmap_2.19.0   dplyr_1.1.4             gtable_0.3.4           
##  [94] sass_0.4.9              digest_0.6.35           SparseArray_1.3.4      
##  [97] ggrepel_0.9.5           rjson_0.2.21            farver_2.1.1           
## [100] htmltools_0.5.7         lifecycle_1.0.4         GlobalOptions_0.1.2    
## [103] bit64_4.0.5

5 Author Contributions

AT, YF, TY, ML, JZ, VO, MD are authors of the package code. MD and YF wrote the vignette. AT, YF and TY designed the package.