Skip to contents

This function allows you split spatially disconnected regions belonging to the same category. In cases where a certain tissue type create isolated "islands" in the tissue section, these islands can be separated. A common example is tertiary lymphoid structures (TLS) which are typically dispersed across a tissue section.

Usage

DisconnectRegions(object, ...)

# Default S3 method
DisconnectRegions(object, spots, verbose = TRUE, ...)

# S3 method for class 'Seurat'
DisconnectRegions(
  object,
  column_name,
  selected_groups = NULL,
  verbose = TRUE,
  ...
)

Arguments

object

An object

...

Arguments passed to other methods

spots

A character vector with spot IDs present object

verbose

Print messages

column_name

A character specifying the name of a column in the meta data slot of a `Seurat` object that contains categorical data, e.g. clusters or manual selections

selected_groups

A character vector to select specific groups in column_name with. All groups are selected by default, but the common use case is to select a region of interest.

Value

An object with disconnected regions

default method

Takes a tibble and set of spot IDs and returns a named character vector with new labels. The names of this vector corresponds to the input spot IDs.

Seurat

A categorical variable is selected from the Seurat object meta data slot using column_name. From this column, one can specify what groups to disconnect with selected_groups. If selected_groups isn't specified, all groups in selected_groups will be disconnected separately. The function returns a Seurat object with additional columns in the meta data slot, one for each group in selected_groups. The suffix to these columns is "_split", so a group in selected_groups called "tissue" will get a column called "tissue_split" with new labels for each spatially disconnected region.

Author

Ludvig Larsson

Examples


library(semla)
library(dplyr)
library(ggplot2)
library(patchwork)

galt_spots_file <- system.file("extdata/mousecolon",
                               "galt_spots.csv",
                                package = "semla")
galt_spots <- read.csv(galt_spots_file) |>
  as_tibble()

# read coordinates
coordfile <- system.file("extdata/mousecolon/spatial",
                         "tissue_positions_list.csv",
                         package = "semla")
coords <- read.csv(coordfile, header = FALSE) |>
  filter(V2 == 1) |>
  select(V1, V6, V5) |>
  setNames(nm = c("barcode", "x", "y")) |>
  bind_cols(sampleID = 1) |>
  as_tibble()

# Select spots
spots <- galt_spots$barcode[galt_spots$selection == "GALT"]
head(spots)
#> [1] "AAACTGCTGGCTCCAA-1" "AACCTTTAAATACGGT-1" "AACGATAATGCCGTAG-1"
#> [4] "AACGTCAGACTAGTGG-1" "AACTAGGCTTGGGTGT-1" "AAGCATACTCTCCTGA-1"

# Find disconnected regions in GALT spots
disconnected_spot_labels <- DisconnectRegions(coords, spots)
#>  Detecting disconnected regions for 106 spots
#>  Found 8 disconnected graph(s) in data
#>  Sorting disconnected regions by decreasing size
#>  Found 12 singletons in data
#> →   These will be labeled as 'singletons'

# Add information to coords and plot
gg <- coords |>
  mutate(galt = NA, galt_disconnected = NA)
gg$galt[match(spots, gg$barcode)] <- "galt"
gg$galt_disconnected[match(names(disconnected_spot_labels), gg$barcode)] <- disconnected_spot_labels

p1 <- ggplot(gg, aes(x, y, color = galt))
p2 <- ggplot(gg, aes(x, y, color = galt_disconnected))
p <- p1 + p2 &
  geom_point() &
  theme_void() &
  coord_fixed()
p



library(semla)
library(ggplot2)
library(patchwork)

se_mcolon <- readRDS(system.file("extdata/mousecolon", "se_mcolon", package = "semla"))

# Plot selected variable
MapLabels(se_mcolon, column_name = "selection",
          pt_size = 3, override_plot_dims = TRUE)


# Disconnect regions
se_mcolon <- DisconnectRegions(se_mcolon, column_name = "selection", selected_groups = "GALT")
#>  Extracting disconnected components for group 'GALT'
#>  Detecting disconnected regions for 106 spots
#>  Found 8 disconnected graph(s) in data
#>  Sorting disconnected regions by decreasing size
#>  Found 12 singletons in data
#> →   These will be labeled as 'singletons'

# Plot split regions
MapLabels(se_mcolon, column_name = "GALT_split",
          pt_size = 3, override_plot_dims = TRUE)


# Note that if multiple sections are present, each section will be given
# it's own prefix in the disconnected groups.
se_merged <- MergeSTData(se_mcolon, se_mcolon)

# Plot selected variable
MapLabels(se_merged, column_name = "selection",
          pt_size = 3, override_plot_dims = TRUE) +
  plot_layout(guides = "collect") &
  theme(legend.position = "top")
#> Error in theme[[element]]: attempt to select more than one element in vectorIndex

# Disconnect regions
se_merged <- DisconnectRegions(se_merged, column_name = "selection", selected_groups = "GALT")
#>  Extracting disconnected components for group 'GALT'
#>  Detecting disconnected regions for 212 spots
#>  Found 16 disconnected graph(s) in data
#>  Sorting disconnected regions by decreasing size
#>  Found 24 singletons in data
#> →   These will be labeled as 'singletons'

# Plot split regions
MapLabels(se_merged, column_name = "GALT_split",
          pt_size = 3, override_plot_dims = TRUE) +
  plot_layout(guides = "collect") &
  theme(legend.position = "top")
#> Error in theme[[element]]: attempt to select more than one element in vectorIndex