Split cluster annotations based on a spatial network

spatialSplitCluster(
  gobject,
  spat_unit = NULL,
  feat_type = NULL,
  spatial_network_name = "Delaunay_network",
  cluster_col,
  split_clus_name = paste0(cluster_col, "_split"),
  include_all_ids = TRUE,
  missing_id_name = "not_connected",
  return_gobject = TRUE
)

Arguments

gobject

giotto object

spat_unit

spatial unit (e.g. "cell")

feat_type

feature type (e.g. "rna", "dna", "protein")

spatial_network_name

character. Name of spatial network to use

cluster_col

character. Column in metadata containing original clustering

split_clus_name

character. Name to assign the split cluster results

include_all_ids

Boolean. Include all ids, including vertex ids not found in the spatial network

missing_id_name

Character. Name for vertices that were missing from spatial network

return_gobject

Boolean. Return giotto object

Value

giotto object with cluster annotations

Examples

library(Giotto)
g <- GiottoData::loadGiottoMini("vizgen")
#> 1. read Giotto object
#> 2. read Giotto feature information
#> 3. read Giotto spatial information
#> 3.1 read Giotto spatial shape information
#> 3.2 read Giotto spatial centroid information
#> 3.3 read Giotto spatial overlap information
#> 4. read Giotto image information
#> 
#> checking default envname 'giotto_env'
#> a system default python environment was found
#> Using python path:
#>  "/usr/bin/python3"
activeSpatUnit(g) <- "aggregate"
spatPlot2D(g, cell_color = "leiden_clus")


g <- spatialSplitCluster(g,
    cluster_col = "leiden_clus",
    split_clus_name = "new"
)
#> Error in V(g): could not find function "V"
# don't show legend since there are too many categories generated
spatPlot2D(g, cell_color = "new", show_legend = FALSE)
#> Error in (function (ggobject, instrs = NULL, sdimx = NULL, sdimy = NULL,     cell_locations_metadata_selected, cell_locations_metadata_other,     cell_color = NULL, color_as_factor = TRUE, cell_color_code = NULL,     cell_color_gradient = NULL, gradient_midpoint = NULL, gradient_style = "divergent",     gradient_limits = NULL, select_cell_groups = NULL, select_cells = NULL,     point_size = 2, point_alpha = 1, point_border_col = "lightgrey",     point_border_stroke = 0.1, show_cluster_center = FALSE, show_center_label = TRUE,     center_point_size = 4, center_point_border_col = "black",     center_point_border_stroke = 0.1, label_size = 4, label_fontface = "bold",     show_other_cells = TRUE, other_cell_color = "lightgrey",     other_point_size = 1, show_legend = TRUE) {    if (is.null(sdimx) || is.null(sdimy)) {        warning(wrap_txt("plot_method = ggplot,\n                        but spatial dimensions for sdimx and/or sdimy\n                        are not specified. It will default to the\n                        'sdimx' and 'sdimy' "))        sdimx <- "sdimx"        sdimy <- "sdimy"    }    point_size <- as.numeric(point_size)    point_alpha <- as.numeric(point_alpha)    point_border_stroke <- as.numeric(point_border_stroke)    center_point_size <- as.numeric(center_point_size)    center_point_border_stroke <- as.numeric(center_point_border_stroke)    label_size <- as.numeric(label_size)    other_point_size <- as.numeric(other_point_size)    pl <- ggobject    if ((!is.null(select_cells) || !is.null(select_cell_groups)) &&         isTRUE(show_other_cells)) {        pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_other,             aes_string(x = sdimx, sdimy), color = other_cell_color,             show.legend = FALSE, size = other_point_size, alpha = point_alpha)    }    if (is.null(cell_color)) {        cell_color <- "lightblue"        pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,             aes_string(x = sdimx, y = sdimy), show.legend = show_legend,             shape = 21, fill = cell_color, size = point_size,             stroke = point_border_stroke, color = point_border_col,             alpha = point_alpha)    }    else if (length(cell_color) > 1L) {        if (is.numeric(cell_color) || is.factor(cell_color)) {            if (nrow(cell_locations_metadata_selected) != length(cell_color)) {                stop("\n vector needs to be the same lengths as\n                    number of cells \n")            }            cell_locations_metadata_selected[["temp_color"]] <- cell_color            pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,                 aes_string2(x = sdimx, y = sdimy, fill = "temp_color"),                 show.legend = show_legend, shape = 21, size = point_size,                 color = point_border_col, stroke = point_border_stroke,                 alpha = point_alpha)        }        else if (is.character(cell_color)) {            if (!all(cell_color %in% grDevices::colors())) {                stop("cell_color is not numeric,\n                    a factor or vector of colors \n")            }            pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,                 aes_string2(x = sdimx, y = sdimy), show.legend = show_legend,                 shape = 21, fill = cell_color, size = point_size,                 color = point_border_col, stroke = point_border_stroke,                 alpha = point_alpha)        }    }    else if (is.character(cell_color)) {        if (!cell_color %in% colnames(cell_locations_metadata_selected)) {            if (!cell_color %in% grDevices::colors()) {                stop(cell_color, " is not a color or a column name \n")            }            pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,                 aes_string2(x = sdimx, y = sdimy), show.legend = show_legend,                 shape = 21, fill = cell_color, size = point_size,                 color = point_border_col, stroke = point_border_stroke,                 alpha = point_alpha)        }        else {            class_cell_color <- class(cell_locations_metadata_selected[[cell_color]])            if ((class_cell_color %in% c("integer", "numeric")) &&                 !isTRUE(color_as_factor)) {                if (!is.null(gradient_limits) && is.vector(gradient_limits) &&                   length(gradient_limits) == 2) {                  lower_lim <- gradient_limits[[1]]                  upper_lim <- gradient_limits[[2]]                  numeric_data <- cell_locations_metadata_selected[[cell_color]]                  limit_numeric_data <- ifelse(numeric_data >                     upper_lim, upper_lim, ifelse(numeric_data <                     lower_lim, lower_lim, numeric_data))                  cell_locations_metadata_selected[[cell_color]] <- limit_numeric_data                }                pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,                   aes_string2(x = sdimx, y = sdimy, fill = cell_color),                   show.legend = show_legend, shape = 21, size = point_size,                   color = point_border_col, stroke = point_border_stroke,                   alpha = point_alpha)            }            else {                if (isTRUE(color_as_factor)) {                  factor_data <- factor(cell_locations_metadata_selected[[cell_color]])                  cell_locations_metadata_selected[[cell_color]] <- factor_data                }                if (isTRUE(show_cluster_center) || isTRUE(show_center_label)) {                  annotated_DT_centers <- cell_locations_metadata_selected[,                     .(center_1 = stats::median(get("sdimx")),                       center_2 = stats::median(get("sdimy"))),                     by = cell_color]                  factor_center_data <- factor(annotated_DT_centers[[cell_color]])                  annotated_DT_centers[[cell_color]] <- factor_center_data                }                pl <- pl + ggplot2::geom_point(data = cell_locations_metadata_selected,                   aes_string2(x = sdimx, y = sdimy, fill = cell_color),                   show.legend = show_legend, shape = 21, size = point_size,                   color = point_border_col, stroke = point_border_stroke,                   alpha = point_alpha)                if (isTRUE(show_cluster_center) && (isTRUE(color_as_factor) ||                   class_cell_color %in% c("character", "factor"))) {                  pl <- pl + ggplot2::geom_point(data = annotated_DT_centers,                     aes_string2(x = "center_1", y = "center_2",                       fill = cell_color), color = center_point_border_col,                     stroke = center_point_border_stroke, size = center_point_size,                     shape = 21, alpha = point_alpha)                }                if (isTRUE(show_center_label)) {                  pl <- pl + ggrepel::geom_text_repel(data = annotated_DT_centers,                     aes_string2(x = "center_1", y = "center_2",                       label = cell_color), size = label_size,                     fontface = label_fontface)                }            }            if (!is.null(cell_color_code)) {                pl <- pl + ggplot2::scale_fill_manual(values = cell_color_code)            }            else if (isTRUE(color_as_factor)) {                number_colors <- length(unique(factor_data))                cell_color_code <- set_default_color_discrete_cell(instrs = instrs)(n = number_colors)                names(cell_color_code) <- unique(factor_data)                pl <- pl + ggplot2::scale_fill_manual(values = cell_color_code)            }            else if (!isTRUE(color_as_factor)) {                if (is.null(gradient_midpoint)) {                  gradient_midpoint <- stats::median(cell_locations_metadata_selected[[cell_color]])                }                pl <- pl + set_default_color_continuous_cell(colors = cell_color_gradient,                   instrs = instrs, style = gradient_style, midpoint = gradient_midpoint,                   type = "fill", )            }        }    }    return(pl)})(ggobject = structure(list(data = structure(list(), class = "waiver"),     layers = list(), scales = <environment>, guides = <environment>,     mapping = structure(list(), names = character(0), class = "uneval"),     theme = structure(list(line = structure(list(colour = "black",         linewidth = 0.5, linetype = 1, lineend = "butt", arrow = FALSE,         inherit.blank = TRUE), class = c("element_line", "element"    )), rect = structure(list(fill = "white", colour = "black",         linewidth = 0.5, linetype = 1, inherit.blank = TRUE), class = c("element_rect",     "element")), text = structure(list(family = "", face = "plain",         colour = "black", size = 11, hjust = 0.5, vjust = 0.5,         angle = 0, lineheight = 0.9, margin = structure(c(0,         0, 0, 0), unit = 8L, class = c("margin", "simpleUnit",         "unit", "unit_v2")), debug = FALSE, inherit.blank = TRUE), class = c("element_text",     "element")), title = NULL, aspect.ratio = NULL, axis.title = NULL,         axis.title.x = structure(list(family = NULL, face = NULL,             colour = NULL, size = NULL, hjust = NULL, vjust = 1,             angle = NULL, lineheight = NULL, margin = structure(c(2.75,             0, 0, 0), unit = 8L, class = c("margin", "simpleUnit",             "unit", "unit_v2")), debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), axis.title.x.top = structure(list(family = NULL,             face = NULL, colour = NULL, size = NULL, hjust = NULL,             vjust = 0, angle = NULL, lineheight = NULL, margin = structure(c(0,             0, 2.75, 0), unit = 8L, class = c("margin", "simpleUnit",             "unit", "unit_v2")), debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), axis.title.x.bottom = NULL, axis.title.y = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = NULL, vjust = 1, angle = 90, lineheight = NULL,             margin = structure(c(0, 2.75, 0, 0), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), axis.title.y.left = NULL, axis.title.y.right = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = NULL, vjust = 1, angle = -90, lineheight = NULL,             margin = structure(c(0, 0, 0, 2.75), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), axis.text = structure(list(family = NULL,             face = NULL, colour = "grey30", size = structure(0.8, class = "rel"),             hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL,             margin = NULL, debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), axis.text.x = structure(list(family = NULL,             face = NULL, colour = NULL, size = NULL, hjust = NULL,             vjust = 1, angle = NULL, lineheight = NULL, margin = structure(c(2.2,             0, 0, 0), unit = 8L, class = c("margin", "simpleUnit",             "unit", "unit_v2")), debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), axis.text.x.top = structure(list(family = NULL,             face = NULL, colour = NULL, size = NULL, hjust = NULL,             vjust = 0, angle = NULL, lineheight = NULL, margin = structure(c(0,             0, 2.2, 0), unit = 8L, class = c("margin", "simpleUnit",             "unit", "unit_v2")), debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), axis.text.x.bottom = NULL, axis.text.y = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = 1, vjust = NULL, angle = NULL, lineheight = NULL,             margin = structure(c(0, 2.2, 0, 0), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), axis.text.y.left = NULL, axis.text.y.right = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = 0, vjust = NULL, angle = NULL, lineheight = NULL,             margin = structure(c(0, 0, 0, 2.2), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), axis.text.theta = NULL, axis.text.r = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = 0.5, vjust = NULL, angle = NULL, lineheight = NULL,             margin = structure(c(0, 2.2, 0, 2.2), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), axis.ticks = structure(list(colour = "grey20",             linewidth = NULL, linetype = NULL, lineend = NULL,             arrow = FALSE, inherit.blank = TRUE), class = c("element_line",         "element")), axis.ticks.x = NULL, axis.ticks.x.top = NULL,         axis.ticks.x.bottom = NULL, axis.ticks.y = NULL, axis.ticks.y.left = NULL,         axis.ticks.y.right = NULL, axis.ticks.theta = NULL, axis.ticks.r = NULL,         axis.minor.ticks.x.top = NULL, axis.minor.ticks.x.bottom = NULL,         axis.minor.ticks.y.left = NULL, axis.minor.ticks.y.right = NULL,         axis.minor.ticks.theta = NULL, axis.minor.ticks.r = NULL,         axis.ticks.length = structure(2.75, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), axis.ticks.length.x = NULL, axis.ticks.length.x.top = NULL,         axis.ticks.length.x.bottom = NULL, axis.ticks.length.y = NULL,         axis.ticks.length.y.left = NULL, axis.ticks.length.y.right = NULL,         axis.ticks.length.theta = NULL, axis.ticks.length.r = NULL,         axis.minor.ticks.length = structure(0.75, class = "rel"),         axis.minor.ticks.length.x = NULL, axis.minor.ticks.length.x.top = NULL,         axis.minor.ticks.length.x.bottom = NULL, axis.minor.ticks.length.y = NULL,         axis.minor.ticks.length.y.left = NULL, axis.minor.ticks.length.y.right = NULL,         axis.minor.ticks.length.theta = NULL, axis.minor.ticks.length.r = NULL,         axis.line = structure(list(), class = c("element_blank",         "element")), axis.line.x = NULL, axis.line.x.top = NULL,         axis.line.x.bottom = NULL, axis.line.y = NULL, axis.line.y.left = NULL,         axis.line.y.right = NULL, axis.line.theta = NULL, axis.line.r = NULL,         legend.background = structure(list(fill = NULL, colour = NA,             linewidth = NULL, linetype = NULL, inherit.blank = TRUE), class = c("element_rect",         "element")), legend.margin = structure(c(5.5, 5.5, 5.5,         5.5), unit = 8L, class = c("margin", "simpleUnit", "unit",         "unit_v2")), legend.spacing = structure(11, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), legend.spacing.x = NULL, legend.spacing.y = NULL,         legend.key = NULL, legend.key.size = structure(1.2, unit = 3L, class = c("simpleUnit",         "unit", "unit_v2")), legend.key.height = NULL, legend.key.width = NULL,         legend.key.spacing = structure(5.5, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), legend.key.spacing.x = NULL, legend.key.spacing.y = NULL,         legend.frame = NULL, legend.ticks = NULL, legend.ticks.length = structure(0.2, class = "rel"),         legend.axis.line = NULL, legend.text = structure(list(            family = NULL, face = NULL, colour = NULL, size = structure(0.8, class = "rel"),             hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL,             margin = NULL, debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), legend.text.position = NULL, legend.title = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = 0, vjust = NULL, angle = NULL, lineheight = NULL,             margin = NULL, debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), legend.title.position = NULL, legend.position = "right",         legend.position.inside = NULL, legend.direction = NULL,         legend.byrow = NULL, legend.justification = "center",         legend.justification.top = NULL, legend.justification.bottom = NULL,         legend.justification.left = NULL, legend.justification.right = NULL,         legend.justification.inside = NULL, legend.location = NULL,         legend.box = NULL, legend.box.just = NULL, legend.box.margin = structure(c(0,         0, 0, 0), unit = 1L, class = c("margin", "simpleUnit",         "unit", "unit_v2")), legend.box.background = structure(list(), class = c("element_blank",         "element")), legend.box.spacing = structure(11, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), panel.background = structure(list(            fill = "white", colour = NA, linewidth = NULL, linetype = NULL,             inherit.blank = TRUE), class = c("element_rect",         "element")), panel.border = structure(list(fill = NA,             colour = "grey20", linewidth = NULL, linetype = NULL,             inherit.blank = TRUE), class = c("element_rect",         "element")), panel.spacing = structure(5.5, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), panel.spacing.x = NULL, panel.spacing.y = NULL,         panel.grid = structure(list(colour = "grey92", linewidth = NULL,             linetype = NULL, lineend = NULL, arrow = FALSE, inherit.blank = TRUE), class = c("element_line",         "element")), panel.grid.major = NULL, panel.grid.minor = structure(list(            colour = NULL, linewidth = structure(0.5, class = "rel"),             linetype = NULL, lineend = NULL, arrow = FALSE, inherit.blank = TRUE), class = c("element_line",         "element")), panel.grid.major.x = NULL, panel.grid.major.y = NULL,         panel.grid.minor.x = NULL, panel.grid.minor.y = NULL,         panel.ontop = FALSE, plot.background = structure(list(            fill = NULL, colour = "white", linewidth = NULL,             linetype = NULL, inherit.blank = TRUE), class = c("element_rect",         "element")), plot.title = structure(list(family = NULL,             face = NULL, colour = NULL, size = structure(1.2, class = "rel"),             hjust = 0, vjust = 1, angle = NULL, lineheight = NULL,             margin = structure(c(0, 0, 5.5, 0), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), plot.title.position = "panel", plot.subtitle = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = 0, vjust = 1, angle = NULL, lineheight = NULL,             margin = structure(c(0, 0, 5.5, 0), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), plot.caption = structure(list(family = NULL,             face = NULL, colour = NULL, size = structure(0.8, class = "rel"),             hjust = 1, vjust = 1, angle = NULL, lineheight = NULL,             margin = structure(c(5.5, 0, 0, 0), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), plot.caption.position = "panel", plot.tag = structure(list(            family = NULL, face = NULL, colour = NULL, size = structure(1.2, class = "rel"),             hjust = 0.5, vjust = 0.5, angle = NULL, lineheight = NULL,             margin = NULL, debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), plot.tag.position = "topleft", plot.tag.location = NULL,         plot.margin = structure(c(5.5, 5.5, 5.5, 5.5), unit = 8L, class = c("margin",         "simpleUnit", "unit", "unit_v2")), strip.background = structure(list(            fill = "grey85", colour = "grey20", linewidth = NULL,             linetype = NULL, inherit.blank = TRUE), class = c("element_rect",         "element")), strip.background.x = NULL, strip.background.y = NULL,         strip.clip = "inherit", strip.placement = "inside", strip.text = structure(list(            family = NULL, face = NULL, colour = "grey10", size = structure(0.8, class = "rel"),             hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL,             margin = structure(c(4.4, 4.4, 4.4, 4.4), unit = 8L, class = c("margin",             "simpleUnit", "unit", "unit_v2")), debug = NULL,             inherit.blank = TRUE), class = c("element_text",         "element")), strip.text.x = NULL, strip.text.x.bottom = NULL,         strip.text.x.top = NULL, strip.text.y = structure(list(            family = NULL, face = NULL, colour = NULL, size = NULL,             hjust = NULL, vjust = NULL, angle = -90, lineheight = NULL,             margin = NULL, debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), strip.text.y.left = structure(list(family = NULL,             face = NULL, colour = NULL, size = NULL, hjust = NULL,             vjust = NULL, angle = 90, lineheight = NULL, margin = NULL,             debug = NULL, inherit.blank = TRUE), class = c("element_text",         "element")), strip.text.y.right = NULL, strip.switch.pad.grid = structure(2.75, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2")), strip.switch.pad.wrap = structure(2.75, unit = 8L, class = c("simpleUnit",         "unit", "unit_v2"))), class = c("theme", "gg"), complete = TRUE, validate = TRUE),     coordinates = <environment>, facet = <environment>, plot_env = <environment>,     layout = <environment>, labels = structure(list(), names = character(0))), class = c("gg", "ggplot")), instrs = structure(list(python_path = "/usr/bin/python3",     show_plot = TRUE, return_plot = FALSE, save_plot = FALSE,     save_dir = NA, plot_format = "png", dpi = 300, units = "in",     height = 9, width = 9, is_docker = FALSE, active_spat_unit = "aggregate",     active_feat_type = "rna"), class = "giottoInstructions"),     sdimx = "sdimx", sdimy = "sdimy", cell_locations_metadata_selected = structure(list(        cell_ID = c("100210519278873141813371229408401071444",         "101161259912191124732236989250178928032", "101488859781016188084173008420811094152",         "101523780333017320796881555775415156847", "102184699197574201819246996094734116255",         "102893953956695364131894293580364005295", "102959391451552633212801591579971725014",         "103900749899182016118292452019873808199", "104570855383158731814075192607294301741",         "104929374280991324709110264935409912418", "105650545880174205232855885504121713476",         "107393799088150693125543893285009932508", "108292802645853579875588341940198493384",         "109000884380615525233958453646681846731", "109243397315976550107464572517681395607",         "109300326319237017972199936203700687945", "110615983935499449765434338770904504245",         "11065258297873257226330942251431244138", "110858042010405247711695373195937122852",         "110900719814678261966908552089216814729", "111687473021757662663527126267334037424",         "112201175467804501210529603201546927780", "112213939421632461263114182386133705127",         "1132915601442719251817312578799507532", "113376516645503704162815748593947980208",         "114012541520472915573375160595131120695", "114410116057448570663366123506131178703",         "114930507336509597805210103184305225198", "115235047525370533075441381313256765131",         "115370283894795045523368609208878185314", "11582702727048098295158267244657813862",         "116773984610486768651813739650149729993", "116860147088450350976374609398998546737",         "118071411587380747913796380721014165557", "119102272531447353986749088457842353881",         "120990022314951784111875169300823080595", "121108122402850896937802185181656711412",         "122255482918389040447479973511863072680", "122906612256038341059239630042273244949",         "123540785709544435621019288242840920053", "123860671559578247432410194986927758864",         "126809950897128716226739975254707226975", "126827073040370531574124290326181150621",         "126981423897188762239468136959275655616", "127985245744460114911125195868071958750",         "129220219089532886548658463773454811807", "12925323527075390484710711277617599454",         "129651421709116970796359170357376179456", "130259975647043922765991420455945942093",         "130416595705865355812306620146726096256", "130428604684362047522418850101908720496",         "130720172120660644879676230721263100142", "130958457634120224230424649457895426168",         "131890283810453131150909184974528681288", "132597437682399706723661851401607977802",         "133061403473432310288273623600023558748", "133205338573668199366304513669599927883",         "133778108341983568319541396789501421324", "134146760472988945324695838070256730703",         "134398773695365619188678200952912609063", "134503679556257538045105223616434677584",         "134509424346276649608483685115101376571", "134512816139291924739198129882869576276",         "134990717652400331091412355235091416313", "135700485415388507953688477460595416178",         "136341171141277731884608634279863298546", "137154375879163008723188861204335796821",         "137348923180371322628727011975895485209", "137356600627014280700323828086313714576",         "138499019560758839217618265857052429787", "138859376429590720661963324654447571708",         "140543565961583233746802451796981444137", "141332891031031919409314720781277973961",         "14225193593112604305545027950864785906", "143039077916367715716039603175706413532",         "143283083203972336774182962473799643189", "143386081176260440019925196855300710659",         "143408196806895889016075556052288734233", "144472141719392958381945362575889661097",         "145421744145915784890159499930205641713", "145569625864836204034742390655246738820",         "14615917600474753437497051666515185188", "146715357009983465209963560859286180117",         "147103070941083943163952951858791268261", "148108075828579037531574808403709598660",         "148336156782096202859532636956126767457", "150082699777048696177232440639953146354",         "150338819641781846748929553541898461633", "15047348685047157337712322370654602141",         "151798130004305208790801168757831384604", "15242486364109501724975900940581726845",         "15247055772869406897093633424720409278", "152684748256642370929802439227360458069",         "153751792203577791006158581642177087065", "15570957646572766699990093696758007165",         "156903360427876380453983412776771432685", "157399406966791992829965288085698660671",         "15834776842182822801451197571763335013", "159339871790082402253769291852207906892",         "159910867331779468466664357386427215132", "160318430812610433362422897343020317434",         "162684318525520950869468479178769741207", "162867077520458456121443579133970123729",         "16326589507615554063401897357427439030", "164424478098970510930576318421517316799",         "165786478473465185470745991122188406667", "166456955228473064319115194076209471689",         "166788256632929614638779193211391658357", "167510831463246601254728331817431905249",         "167565166109688866385887526385589933736", "167710327060928309829388429279250508392",         "167818783196654344295653476753505898360", "168376325588102040437463621554621047372",         "169315824573918958644050687003673310184", "170833460535439412738579124041592991444",         "172181421897607556322673704318102678295", "173565652634409972151932833827926844389",         "173780780834031059819946658163431921979", "174306823762889142173283452439684229948",         "175540604452034099044348476236813150837", "175694775429793559431486664881241024950",         "176844289786228093052039491926955764947", "17685062374745280598492217386845129350",         "177374477012547854406657016583166519897", "177757177666889772027017950398587309639",         "17817477728742691260808256980746537959", "17868848607867654301368031294266874310",         "17891772882124348027687846188117055017", "179297712006471333306826676970515917851",         "180947508370750255585892730777436680945", "182132384503107798660396708280285136358",         "182235958169292445695483205478317795477", "183227745956657225549068107012033843521",         "183331095996852402573804086784904555362", "183741411728734025380253058401004927281",         "185055418446250460085953045917995887188", "185903314401459366597627436588666236388",         "18618890331367558707292305186664578314", "186404099358317212811882499608798243906",         "18688512300947206776138477755507677854", "186988931894710833920932112634285943415",         "187952627468949069447188707715308813657", "188179457167181317036865075745680501410",         "188272552961210328960576362558402902404", "188746395323628946245311425788373456614",         "188822519415877250518157478196002237563", "1900302715660571356090444774019116326",         "190687643154627893064711601675234362640", "190914215414932175319549828964695470199",         "191206312549658601825330101400584481202", "192016641652249921747616528044078223022",         "192658791227385134589435190081371416880", "192778585506432744690553563495715115375",         "19311588976622944909682910864587104989", "193494943380536103911564584209623038894",         "194075738125756511305414653957971899665", "195560489096124900863839745227342468697",         "199120674047319197163303511795306438224", "203192161403397797138670022274582721699",         "204556634364633516361433624159635566159", "204611834270911643022584999768859598082",         "205313689782471730907939471099462967378", "20548793658722995878220914240286086757",         "206016050634629330546630679047044021073", "206702762285684421190019779213421380201",         "208296155235436983609914508200288085338", "210921176344645761631560197472087493107",         "212501669348639182111017279862555064555", "214394514156259228118188949454902817376",         "215903882687682534993992774702450409922", "216701996099683814512199402223708471323",         "21700385406808067007385352842128268009", "217935684608659337114407628630185602063",         "217996462208701069168232210617040322639", "218629898331681274111795089362460661925",         "21934936165997373583174173761929761438", "219395460896730409504913370408145829680",         "220626094022262894991291197563012916160", "221479125645462047472251944457654693279",         "221552844500892873527711708420843512418", "221669638772738575000116137509912039310",         "221775490684285165655549810831578378190", "222047855782557501653245982274520432658",         "222558564793590946281522728407706827280", "22324195774794543740330922827922612078",         "224458376429228506642398057779371677646", "225320076698585701230879835670228271140",         "22589134237962396239798326549117591973", "226667648171626631993624597360362535576",         "226912346807310637711937183879196326571", "227232155811404089141823608874580791245",         "227356122322603538491761885302392892043", "229457572568694183703128077940694870639",         "230344318208995342827768566280706457626", "230434995691599163145128681350572473545",         "231212643322278795528005770495251497705", "231214965974920639621074459624115776485",         "231660546017839462615756171107600325424", "232341148243064965949760007626810012851",         "233229703476821612486041386363745481186", "233382175508626991409571538780521441397",         "234003732411085239787840498999176376451", "234088357422223940809493872293907937063",         "23470744401352443589618734383441183930", "234988593327199604253479621078255555503",         "23551753773108861958615969019645270616", "235525236509310611219079834156467779332",         "235618384612800641161632285805461980617", "236677629222667262221261861475728542818",         "236938169420664432126575547704304293443", "237208479802011398022456526669115595941",         "238309699419057978548260502617868197180", "239846537277340745174658842807578498270",         "240266318468784815782282035231012189978", "240649020551054330404932383065726870513",         "24065553107572578810405955533838966091", "242344253446335828801918911189454926407",         "244015124549889909957742476033146111487", "244247765904337326625465691380839405459",         "244410583035254308944305978721579469225", "244448312826260498647079278647004353269",         "244840145612854293464477850603474951260", "245103083552800322536720574313609922881",         "246032583624178870926087715226493279333", "246126973650386079946610175780694884246",         "2467888014556719520437642348850497467", "24699651456008400222756535113165190693",         "247361386871565801975800133016251357782", "247969201651378197344222393255993686662",         "248026342734562151407765229569772513183", "250481714349085757816071122854700489348",         "251165453467855037835078154867769901116", "251905496166492083168644493421091558216",         "253052486928807825512468515844100012460", "254538897036257180617662178141894962698",         "254829253202043893331055483138743800247", "255399242169888297270328346140653951261",         "257184545464839903394564555141875300987", "2582675971475731682260721390861103474",         "25922583678755692656920964930662005596", "261177732716438162305697512158250834806",         "262323915115773877344473192484876459225", "262797098003740683881650619022037793005",         "262996653580953175020435707363716649390", "263875000650313986266616666686991961034",         "263958103644625994793451997426584734716", "264234489423886906860498828392801290668",         "265185306239991354232232246957204545228", "26600094853800457409258487269921579081",         "266005163053960773010098888475281400503", "266246243070401825856501948379131507953",         "266413162898429280572455841453688616870", "266784614074408496658057365712205158914",         "266856617350510621690765662339614725825", "26764248937762708816383106393244759234",         "268188723720442422020503054898954079256", "269762584503067483382226769755792813261",         "271967915636064836314881508293335292245", "273453901382597562433878618029414197004",         "273673567134859598195435250950149370161", "274176126496863898679934791272921588227",         "275114654277609277360760057781974602468", "275433384489110810553053224140654159944",         "275784684664527332374777211328350223506", "275841288419653375629395126018772872016",         "27666206735695437393204421885258583706", "277057315125198906319398446608128392905",         "277649896089373302104931776245681942029", "27849375930353420407648187924644578710",         "279869243339430268002980976279350641444", "280661554698226730422771895627995747059",         "281402768276240444401858895141644361656", "281507924845092486101374634274198866453",         "282850891930907509412045175294442459530", "283821893476134729825893155000887153128",         "28384214365488550451919004957861784305", "284140281535622889625016165327980867101",         "284369037604804626865110888576050199330", "285327092730254305898484549338981819019",         "286146294981380023269011675378975275188", "286906689872367261752702769926754066848",         "287330377702310805971026616573810741665", "287769191931929540682855969052193377568",         "287969199156100786397777302380341680560", "288822108801800165318171357739905375883",         "289148615199370873797853262369404024216", "29022983717691141416347581059842026237",         "290442965172011620870251146805010627671", "291975341311453330406711526698967834209",         "292254379263157279159966458654907155929", "292504201660417228678538217822983666799",         "293490979527928845906184572736930005899", "293652672526983996543508493676572879068",         "293693386983964643482561813994426364527", "293900582929631255788566880963197704396",         "29479908025566786754721409752134977949", "295193149306421749943849825086053455411",         "29528151115077617700837505751448202323", "296019945099320175547230863498668480924",         "297563171753100265814870270563920274574", "29830797402170053137610418043225506847",         "298689167746167965915888767957052773818", "298736543860310751956600241513285727995",         "299369249493863603085089713363428254253", "301054712356664458042996323827909441002",         "301775007782900467662505750315226942375", "30222355550742125173065032035537805062",         "304560432600831995659079356647103974886", "304673565524465389880593944274656011132",         "304763943125750366158403753213031436047", "304842190541754537761816256358565562302",         "305306955532868686456926844192964831687", "305541713153000350491948015377322269301",         "305625923911364188380681674803716663189", "30571638947438619177947320407779261750",         "306415949245581212081161219410047325001", "307030440204593378842812081935039092344",         "307090767942904357946740728728278236688", "307662886482854582941216578059098333084",         "307915098305811968258082436904262060268", "307983214226701503881620469518487517765",         "31072896077757820678000109671990674373", "311565496674213535805029947713320284697",         "311587331826654155209560142756469108973", "31181189933655291443473789457874864875",         "313341882093478712453835418083823400203", "313975735429362327941519981070086437594",         "314397389362641167108869069386457433770", "3151102251621248215463444891373423271",         "315355495413290675346823717752991334334", "31617660672408056199009792519270924934",         "316289522368890354495930310222776908199", "316643138037436111979502485064115212429",         "318035034604626466273938282537515473359", "318439340668767417720582355350205310941",         "318532784331621717580657927096623303776", "3188909098022617910378369321966273882",         "318995879282318989627235045690211636294", "321548286800507302842094370722988018222",         "322749018360113729239532727743897856655", "322879686187630160969459793861944841206",         "323425294836234834327823003063686325779", "323754550002953984063006506310071917306",         "323855205301861459598863982849418740052", "32422253415776258079819139802733069941",         "324637742389179243201282186318588452049", "324877467507432389063800715005904969237",         "32535304551014256860916796345005841454", "325896428237586114830946437310469001833",         "326170763238444727334902609993698047961", "328891726607418454659643302361160567789",         "32944790627105381861829233020285020883", "330404862840097944636249994320280071064",         "330850389163886577071114668277958486114", "331580323004945087311483453179965743309",         "331675815801204232182324913632094035806", "333572131402082081028422604080773296689",         "334145636372571939036618142120397559762", "334199301045926627171760429217123408914",         "334356931858742201981142004419227940530", "335295524680090725199231409883288198017",         "336962253419631471227152861374195773820", "339814056401091912617621500767389941735",         "34878460784377706458972107228242295523", "35118346554513854436644695033199584696",         "35350560665352546376343309949550148561", "36648998424868029072860674954666559763",         "37479641932811677921943248732877032868", "38331878467780982488753572125978727953",         "38916994407041414328293715049546370868", "39033692777509843205319060807429911979",         "39092428598574451585825742476177899084", "3942785923272820952395109293003259310",         "40893553496134212159002004537795080008", "41054036480225512911591384807281320971",         "41792385033810443584506825240935851959", "42056064196611141769700924475836317519",         "43149905814879257254044429661772116678", "43731708947199618294982749003938483862",         "44008904762684544698290274594786253864", "44197902970141946871502798467323259089",         "44721220002773982161418195292536576043", "44800312482364429019010873942090508992",         "45132055669603860975170270958616474203", "47275912178029130797780898068213599096",         "48024672048124996997588408479044670509", "48152965157308750991850607159706350880",         "48397968139053633868743221368648769526", "49659261269402625560370048163327909098",         "51348907619842676963078202479438175138", "52046521295547656906553376592693748387",         "5354320566326536115841810233457333218", "53613579601853014930793381801962795926",         "56815638009315000170441964570512336625", "57203625626451579261315887898923502046",         "57886540394173804425059553784879702260", "59141517931138845718061638546803837463",         "6017441551851134235916601481192643500", "60863868456807893930962592949762104949",         "61273130520076218830774520817874849090", "62669443199671326763841071380380779477",         "6380671372744430258754116433861320161", "64228015236811922665804882776457047292",         "65855854848879329159292019718060662708", "66946836857814073236396205199912161961",         "67505083691358463281364224289464582799", "67532821514617092397935003422482443295",         "68418314542386876178693610244900595267", "68990549542278897227915268250541247751",         "69758036960578764659538567543488921480", "70219882915166469874938407731799217344",         "71594783203305290534744951238212591740", "71600478055455467653117564960659847487",         "72822579613387275003530123860517675400", "73431468557394859280671604185501794778",         "74125701104049486882485321540287535703", "74839862687032814962428783365592582127",         "74968218442850503187630737213712231283", "75286702783716447443887872812098770697",         "75427879267941007278525459498051337848", "75660428514717127988983246148828583482",         "75682347267697870039469591993208007445", "76322781861215450124167009829890606622",         "76396616519260032039655319003749545565", "77151711298730578178892667721058396928",         "77541886028463256801311974652160917274", "77782228870577724567477221255169934206",         "78012909104745781869894200959280724483", "79657539548156727931862352284967450950",         "79668971589879493465166271739355011800", "7974460202504320202511564310548388122",         "81527318330034058749368671310130399347", "81593876287340493013457914240003956286",         "84576212513852183046872073655366585876", "85256332381047379632101125573323549097",         "86277139408727638500404865562141876167", "86608057220384468155234792658531818493",         "87201732838895803160157966154040078721", "87260224659312905497866017323180367450",         "87704531827902937263159273193361050752", "8777587181320516093160667806451882030",         "87903363874776475366779322866396664731", "88684037232090648725039839526491456412",         "88743795534206169429467675642537392511", "88966929892701743590207517249832912256",         "90740652120142025598838838824737408007", "91211463254554380221520030192271461128",         "93224512791273624539716048847627852106", "93766399603521973873598911761678204002",         "94116688659316792325585723413480005969", "94915957193797412218079317943892351685",         "9538866320245722231901445225545432644", "95576868254612369736656993305254629824",         "95838678880751873613229512065975406368", "95947958963963707263153541936375959179",         "96091484747656303270745913028146994621", "9668748337336721830701975018211142813",         "9677424102111816817518421117250891895", "97068595823890802071024838798130036179",         "97411078642927912684859796714759494710", "9816437869021910185567097363182418837",         "98561957902191275233320065611022298397"), nr_feats = c(22L,         36L, 35L, 39L, 44L, 36L, 21L, 64L, 43L, 46L, 56L, 51L,         43L, 32L, 29L, 27L, 36L, 38L, 28L, 49L, 27L, 32L, 52L,         44L, 21L, 34L, 26L, 33L, 21L, 35L, 46L, 19L, 7L, 23L,         58L, 25L, 29L, 27L, 46L, 34L, 18L, 8L, 31L, 40L, 59L,         66L, 29L, 17L, 46L, 39L, 53L, 20L, 28L, 30L, 27L, 10L,         19L, 23L, 73L, 31L, 34L, 44L, 24L, 25L, 7L, 50L, 28L,         28L, 58L, 36L, 11L, 28L, 40L, 21L, 42L, 81L, 21L, 41L,         37L, 15L, 58L, 7L, 65L, 21L, 39L, 13L, 25L, 43L, 47L,         41L, 27L, 9L, 40L, 21L, 42L, 15L, 42L, 6L, 31L, 51L,         13L, 25L, 13L, 36L, 22L, 28L, 35L, 45L, 12L, 26L, 28L,         58L, 46L, 48L, 8L, 9L, 14L, 17L, 7L, 42L, 26L, 58L, 5L,         32L, 23L, 18L, 47L, 63L, 41L, 6L, 18L, 8L, 39L, 32L,         21L, 12L, 8L, 53L, 17L, 25L, 7L, 22L, 24L, 32L, 25L,         49L, 24L, 17L, 13L, 12L, 54L, 44L, 45L, 66L, 11L, 47L,         48L, 30L, 42L, 14L, 33L, 54L, 26L, 27L, 32L, 23L, 24L,         42L, 6L, 57L, 5L, 44L, 56L, 30L, 38L, 26L, 71L, 10L,         62L, 78L, 27L, 49L, 17L, 33L, 60L, 10L, 27L, 72L, 43L,         32L, 26L, 22L, 40L, 37L, 48L, 37L, 34L, 42L, 39L, 34L,         58L, 31L, 16L, 28L, 51L, 25L, 45L, 43L, 45L, 44L, 56L,         22L, 45L, 32L, 5L, 75L, 26L, 20L, 27L, 18L, 9L, 45L,         59L, 23L, 30L, 45L, 7L, 30L, 31L, 34L, 44L, 7L, 24L,         20L, 24L, 51L, 19L, 78L, 31L, 29L, 50L, 22L, 23L, 33L,         63L, 38L, 12L, 32L, 13L, 54L, 32L, 44L, 55L, 8L, 26L,         54L, 29L, 9L, 11L, 52L, 27L, 40L, 24L, 35L, 30L, 18L,         6L, 14L, 46L, 41L, 36L, 42L, 51L, 45L, 20L, 62L, 51L,         29L, 19L, 27L, 28L, 76L, 17L, 18L, 18L, 52L, 30L, 31L,         10L, 10L, 32L, 61L, 53L, 20L, 73L, 48L, 10L, 22L, 8L,         21L, 67L, 21L, 25L, 39L, 7L, 16L, 27L, 30L, 20L, 31L,         40L, 20L, 36L, 51L, 18L, 32L, 31L, 62L, 24L, 34L, 36L,         22L, 55L, 31L, 64L, 19L, 36L, 10L, 27L, 7L, 43L, 41L,         25L, 59L, 20L, 12L, 26L, 16L, 39L, 63L, 9L, 20L, 23L,         44L, 12L, 28L, 42L, 21L, 46L, 41L, 25L, 39L, 26L, 39L,         36L, 10L, 71L, 9L, 28L, 40L, 25L, 8L, 29L, 31L, 8L, 30L,         9L, 68L, 40L, 46L, 24L, 49L, 21L, 46L, 23L, 43L, 47L,         47L, 30L, 29L, 7L, 40L, 45L, 8L, 30L, 31L, 50L, 78L,         78L, 15L, 51L, 27L, 38L, 41L, 7L, 41L, 25L, 41L, 12L,         47L, 30L, 54L, 35L, 22L, 44L, 29L, 28L, 29L, 46L, 26L,         15L, 53L, 59L, 31L, 42L, 32L, 5L, 38L, 45L, 23L, 30L,         16L, 26L, 35L, 11L, 14L, 68L, 21L, 14L, 48L, 66L, 62L,         35L, 37L, 48L, 60L, 42L, 40L, 37L, 43L, 39L, 27L, 29L,         37L, 49L, 29L, 27L, 43L, 18L, 31L, 41L, 29L, 51L, 23L,         20L, 27L, 8L, 30L, 46L, 33L, 31L, 53L), perc_feats = c(6.52818991097923,         10.6824925816024, 10.3857566765579, 11.5727002967359,         13.0563798219585, 10.6824925816024, 6.23145400593472,         18.9910979228487, 12.7596439169139, 13.6498516320475,         16.6172106824926, 15.13353115727, 12.7596439169139, 9.49554896142433,         8.6053412462908, 8.01186943620178, 10.6824925816024,         11.2759643916914, 8.30860534124629, 14.540059347181,         8.01186943620178, 9.49554896142433, 15.4302670623145,         13.0563798219585, 6.23145400593472, 10.0890207715134,         7.71513353115727, 9.79228486646884, 6.23145400593472,         10.3857566765579, 13.6498516320475, 5.6379821958457,         2.07715133531157, 6.82492581602374, 17.2106824925816,         7.41839762611276, 8.6053412462908, 8.01186943620178,         13.6498516320475, 10.0890207715134, 5.34124629080119,         2.37388724035608, 9.19881305637982, 11.8694362017804,         17.5074183976261, 19.5845697329377, 8.6053412462908,         5.04451038575668, 13.6498516320475, 11.5727002967359,         15.727002967359, 5.93471810089021, 8.30860534124629,         8.90207715133531, 8.01186943620178, 2.9673590504451,         5.6379821958457, 6.82492581602374, 21.6617210682493,         9.19881305637982, 10.0890207715134, 13.0563798219585,         7.12166172106825, 7.41839762611276, 2.07715133531157,         14.8367952522255, 8.30860534124629, 8.30860534124629,         17.2106824925816, 10.6824925816024, 3.26409495548961,         8.30860534124629, 11.8694362017804, 6.23145400593472,         12.4629080118694, 24.0356083086053, 6.23145400593472,         12.1661721068249, 10.9792284866469, 4.45103857566766,         17.2106824925816, 2.07715133531157, 19.2878338278932,         6.23145400593472, 11.5727002967359, 3.85756676557863,         7.41839762611276, 12.7596439169139, 13.946587537092,         12.1661721068249, 8.01186943620178, 2.67062314540059,         11.8694362017804, 6.23145400593472, 12.4629080118694,         4.45103857566766, 12.4629080118694, 1.78041543026706,         9.19881305637982, 15.13353115727, 3.85756676557863, 7.41839762611276,         3.85756676557863, 10.6824925816024, 6.52818991097923,         8.30860534124629, 10.3857566765579, 13.353115727003,         3.56083086053412, 7.71513353115727, 8.30860534124629,         17.2106824925816, 13.6498516320475, 14.2433234421365,         2.37388724035608, 2.67062314540059, 4.15430267062314,         5.04451038575668, 2.07715133531157, 12.4629080118694,         7.71513353115727, 17.2106824925816, 1.48367952522255,         9.49554896142433, 6.82492581602374, 5.34124629080119,         13.946587537092, 18.6943620178042, 12.1661721068249,         1.78041543026706, 5.34124629080119, 2.37388724035608,         11.5727002967359, 9.49554896142433, 6.23145400593472,         3.56083086053412, 2.37388724035608, 15.727002967359,         5.04451038575668, 7.41839762611276, 2.07715133531157,         6.52818991097923, 7.12166172106825, 9.49554896142433,         7.41839762611276, 14.540059347181, 7.12166172106825,         5.04451038575668, 3.85756676557863, 3.56083086053412,         16.0237388724036, 13.0563798219585, 13.353115727003,         19.5845697329377, 3.26409495548961, 13.946587537092,         14.2433234421365, 8.90207715133531, 12.4629080118694,         4.15430267062314, 9.79228486646884, 16.0237388724036,         7.71513353115727, 8.01186943620178, 9.49554896142433,         6.82492581602374, 7.12166172106825, 12.4629080118694,         1.78041543026706, 16.9139465875371, 1.48367952522255,         13.0563798219585, 16.6172106824926, 8.90207715133531,         11.2759643916914, 7.71513353115727, 21.0682492581602,         2.9673590504451, 18.3976261127596, 23.1454005934718,         8.01186943620178, 14.540059347181, 5.04451038575668,         9.79228486646884, 17.8041543026706, 2.9673590504451,         8.01186943620178, 21.3649851632047, 12.7596439169139,         9.49554896142433, 7.71513353115727, 6.52818991097923,         11.8694362017804, 10.9792284866469, 14.2433234421365,         10.9792284866469, 10.0890207715134, 12.4629080118694,         11.5727002967359, 10.0890207715134, 17.2106824925816,         9.19881305637982, 4.74777448071217, 8.30860534124629,         15.13353115727, 7.41839762611276, 13.353115727003, 12.7596439169139,         13.353115727003, 13.0563798219585, 16.6172106824926,         6.52818991097923, 13.353115727003, 9.49554896142433,         1.48367952522255, 22.2551928783383, 7.71513353115727,         5.93471810089021, 8.01186943620178, 5.34124629080119,         2.67062314540059, 13.353115727003, 17.5074183976261,         6.82492581602374, 8.90207715133531, 13.353115727003,         2.07715133531157, 8.90207715133531, 9.19881305637982,         10.0890207715134, 13.0563798219585, 2.07715133531157,         7.12166172106825, 5.93471810089021, 7.12166172106825,         15.13353115727, 5.6379821958457, 23.1454005934718, 9.19881305637982,         8.6053412462908, 14.8367952522255, 6.52818991097923,         6.82492581602374, 9.79228486646884, 18.6943620178042,         11.2759643916914, 3.56083086053412, 9.49554896142433,         3.85756676557863, 16.0237388724036, 9.49554896142433,         13.0563798219585, 16.3204747774481, 2.37388724035608,         7.71513353115727, 16.0237388724036, 8.6053412462908,         2.67062314540059, 3.26409495548961, 15.4302670623145,         8.01186943620178, 11.8694362017804, 7.12166172106825,         10.3857566765579, 8.90207715133531, 5.34124629080119,         1.78041543026706, 4.15430267062314, 13.6498516320475,         12.1661721068249, 10.6824925816024, 12.4629080118694,         15.13353115727, 13.353115727003, 5.93471810089021, 18.3976261127596,         15.13353115727, 8.6053412462908, 5.6379821958457, 8.01186943620178,         8.30860534124629, 22.5519287833828, 5.04451038575668,         5.34124629080119, 5.34124629080119, 15.4302670623145,         8.90207715133531, 9.19881305637982, 2.9673590504451,         2.9673590504451, 9.49554896142433, 18.1008902077151,         15.727002967359, 5.93471810089021, 21.6617210682493,         14.2433234421365, 2.9673590504451, 6.52818991097923,         2.37388724035608, 6.23145400593472, 19.8813056379822,         6.23145400593472, 7.41839762611276, 11.5727002967359,         2.07715133531157, 4.74777448071217, 8.01186943620178,         8.90207715133531, 5.93471810089021, 9.19881305637982,         11.8694362017804, 5.93471810089021, 10.6824925816024,         15.13353115727, 5.34124629080119, 9.49554896142433, 9.19881305637982,         18.3976261127596, 7.12166172106825, 10.0890207715134,         10.6824925816024, 6.52818991097923, 16.3204747774481,         9.19881305637982, 18.9910979228487, 5.6379821958457,         10.6824925816024, 2.9673590504451, 8.01186943620178,         2.07715133531157, 12.7596439169139, 12.1661721068249,         7.41839762611276, 17.5074183976261, 5.93471810089021,         3.56083086053412, 7.71513353115727, 4.74777448071217,         11.5727002967359, 18.6943620178042, 2.67062314540059,         5.93471810089021, 6.82492581602374, 13.0563798219585,         3.56083086053412, 8.30860534124629, 12.4629080118694,         6.23145400593472, 13.6498516320475, 12.1661721068249,         7.41839762611276, 11.5727002967359, 7.71513353115727,         11.5727002967359, 10.6824925816024, 2.9673590504451,         21.0682492581602, 2.67062314540059, 8.30860534124629,         11.8694362017804, 7.41839762611276, 2.37388724035608,         8.6053412462908, 9.19881305637982, 2.37388724035608,         8.90207715133531, 2.67062314540059, 20.1780415430267,         11.8694362017804, 13.6498516320475, 7.12166172106825,         14.540059347181, 6.23145400593472, 13.6498516320475,         6.82492581602374, 12.7596439169139, 13.946587537092,         13.946587537092, 8.90207715133531, 8.6053412462908, 2.07715133531157,         11.8694362017804, 13.353115727003, 2.37388724035608,         8.90207715133531, 9.19881305637982, 14.8367952522255,         23.1454005934718, 23.1454005934718, 4.45103857566766,         15.13353115727, 8.01186943620178, 11.2759643916914, 12.1661721068249,         2.07715133531157, 12.1661721068249, 7.41839762611276,         12.1661721068249, 3.56083086053412, 13.946587537092,         8.90207715133531, 16.0237388724036, 10.3857566765579,         6.52818991097923, 13.0563798219585, 8.6053412462908,         8.30860534124629, 8.6053412462908, 13.6498516320475,         7.71513353115727, 4.45103857566766, 15.727002967359,         17.5074183976261, 9.19881305637982, 12.4629080118694,         9.49554896142433, 1.48367952522255, 11.2759643916914,         13.353115727003, 6.82492581602374, 8.90207715133531,         4.74777448071217, 7.71513353115727, 10.3857566765579,         3.26409495548961, 4.15430267062314, 20.1780415430267,         6.23145400593472, 4.15430267062314, 14.2433234421365,         19.5845697329377, 18.3976261127596, 10.3857566765579,         10.9792284866469, 14.2433234421365, 17.8041543026706,         12.4629080118694, 11.8694362017804, 10.9792284866469,         12.7596439169139, 11.5727002967359, 8.01186943620178,         8.6053412462908, 10.9792284866469, 14.540059347181, 8.6053412462908,         8.01186943620178, 12.7596439169139, 5.34124629080119,         9.19881305637982, 12.1661721068249, 8.6053412462908,         15.13353115727, 6.82492581602374, 5.93471810089021, 8.01186943620178,         2.37388724035608, 8.90207715133531, 13.6498516320475,         9.79228486646884, 9.19881305637982, 15.727002967359),         total_expr = c(163.692330178415, 228.726853428561, 242.045796740308,         262.3842374653, 291.587729538521, 250.264857191484, 159.5983996015,         390.206024743421, 277.36503392341, 296.635331730311,         337.478693726605, 320.566185225697, 286.91759755849,         226.512150782221, 211.539772886398, 199.08692611053,         240.514266883658, 257.104616344045, 203.549850856263,         304.966731922364, 195.673699907821, 226.443113674752,         329.957188571576, 287.88576116495, 164.657712455862,         235.003820124896, 191.479454050667, 235.859343407827,         158.294725598894, 236.935981540182, 298.286627327301,         146.596650688068, 65.8400799134835, 171.245046569926,         356.386918104633, 187.91182199234, 209.035623375758,         201.815816008351, 291.352054695766, 231.176206082385,         141.483379413636, 73.9617584834119, 224.010395304383,         249.975850425105, 357.296941313188, 343.387890609629,         205.33364187125, 137.257607195737, 306.86707688653, 265.292113091157,         337.486493636314, 156.790547894473, 204.563749185545,         215.320806696672, 195.825547499833, 86.5410232319432,         148.468343456463, 176.428276720893, 356.150618921716,         214.066247188435, 231.671744431579, 283.345718417092,         179.979503730803, 186.951926168222, 66.3766307261831,         317.27233461184, 201.741047880885, 203.722675404683,         348.58062410676, 249.486624149424, 88.8633078250093,         201.871816309341, 260.971005844645, 162.948766907701,         274.397738094956, 414.794773039381, 158.253111696854,         245.970647745788, 257.043989888285, 124.836806732049,         347.866065532961, 65.8400799134835, 370.299131052109,         161.276275615032, 263.981099570347, 109.589566549003,         174.712186611607, 283.231189798787, 298.379477151261,         272.964267980386, 197.025294385751, 81.0659104805998,         254.025324905642, 162.74117940239, 275.18962296077, 124.836806732049,         277.789043448344, 57.3235383471785, 225.122378491466,         320.897829934073, 110.657117583761, 185.344786050231,         111.295072123342, 235.551724094923, 166.403640883248,         193.780536346064, 239.306254034887, 277.790276102015,         103.085145323914, 193.633527627871, 191.028508308481,         353.294934640302, 300.495351116362, 310.536440273524,         68.3651845739757, 81.4798921330783, 116.715128162121,         135.223423719377, 66.3766307261831, 262.133210467124,         192.211200415904, 335.298733472396, 48.9954963309587,         226.577351937562, 171.024189492616, 142.445203187484,         300.489858733234, 363.979852580328, 275.10868063616,         57.3235383471785, 137.920293505292, 73.2328749262814,         254.027467656201, 228.545071613743, 163.753983075372,         103.394970792141, 69.9524858031601, 321.465328289528,         136.219231205612, 186.337189048693, 66.3766307261831,         156.779393068861, 180.072435030303, 214.464260174102,         183.694817782271, 309.449635853535, 170.264949579948,         138.094489199971, 109.589566549003, 104.090353753993,         334.388698914332, 282.650795430612, 285.64340767153,         383.287647066291, 96.7665620609742, 300.929090802139,         306.634420728611, 216.237828940593, 277.277419243474,         118.08789728749, 232.944924529869, 335.847868730295,         187.017466800749, 191.189069075975, 213.237563922075,         177.668161156715, 179.79228792705, 279.386589897727,         57.8932460808558, 339.158124689837, 49.83613129418, 290.066603023017,         350.810759008852, 210.932275563016, 257.986914760725,         184.793461805205, 405.015020483889, 89.05862573874, 375.826089297804,         426.884880112786, 197.610345033658, 316.029115017494,         135.336745487359, 232.362771593668, 357.377306359766,         87.9073793143189, 199.498144443254, 420.203256878236,         266.3254444453, 226.150777238699, 194.716100380265, 169.088064224255,         261.725921949589, 245.95623551455, 303.722936222198,         253.226329110432, 234.84520678736, 283.201552875243,         264.054004585561, 235.787180109466, 335.804906431938,         218.712434384335, 129.657135820864, 204.570594968069,         319.6833769925, 183.48842290666, 291.649853308407, 285.807730195264,         265.987440808709, 296.212883056232, 343.989391906438,         168.413997364666, 290.716094783496, 227.989955079209,         49.4098614355285, 424.979338787052, 195.421650930503,         138.249068260971, 195.163432518345, 145.811887580284,         77.2694735147646, 297.085496540216, 354.012602203427,         177.967002367667, 210.002380737085, 294.73617615711,         64.778506211077, 217.426994984025, 221.770856988102,         236.380328558286, 284.995924953762, 66.0289791557615,         166.683677292415, 156.394294580526, 175.754755315412,         319.780684687897, 152.121349856436, 425.654947409964,         221.244457061912, 204.049243933302, 316.975754391872,         170.461227096848, 174.756599846379, 232.234911222851,         371.776603822854, 243.718855933686, 102.69751442727,         227.995137164673, 110.379769742586, 331.166721824113,         225.370575964106, 265.830296481056, 335.324552474956,         73.9617584834119, 186.079142880009, 334.404255536782,         211.437806362749, 78.6795586574796, 94.2493898411744,         314.863678147357, 191.506843952224, 264.804237259578,         181.208108283694, 232.350368352881, 215.320806696672,         141.214910736682, 57.3235383471785, 115.838180331754,         297.757782773326, 272.756001629619, 253.09784143737,         267.212510088264, 323.528475568902, 298.463960432213,         158.685966911, 369.628648095274, 325.421882802608, 213.444467250517,         146.460460093844, 198.810618062, 200.139150043829, 412.192739220494,         134.087919122188, 143.927669565453, 143.699164123555,         323.476984182264, 216.24387218019, 220.444329747037,         88.6447398615722, 89.6866679319521, 218.495730156299,         360.715203601347, 331.565036015946, 157.590423518939,         418.337239367199, 301.035614246325, 89.05862573874, 170.873680540139,         73.7464532768432, 157.665898251596, 394.250619953774,         164.058629112283, 186.238741410188, 259.475236037217,         64.1395507247593, 130.412492500714, 192.277701704269,         216.103142680106, 155.253881777405, 218.716102660407,         260.28790960638, 149.602732442843, 246.867005607273,         319.91881767521, 143.51415100685, 221.176631318816, 220.251182546872,         373.650313318566, 181.175575954962, 231.005554659199,         246.093620189768, 168.693015862322, 330.42667324578,         213.622619613112, 374.397778309976, 149.867246783102,         251.079676200395, 86.432795960925, 198.914080255497,         66.0289791557615, 281.603153418144, 250.159359063845,         185.49641589491, 355.109868362853, 152.689895100413,         104.090353753993, 195.127983044515, 119.46175604472,         259.044135190598, 372.965864411677, 80.9368035393379,         155.748158551411, 173.869545543954, 284.328495591786,         102.528045340653, 202.645710514994, 272.863691818186,         152.085381766705, 293.651933721381, 269.661178077665,         174.510689751023, 252.883445716812, 189.513811103394,         261.230144288553, 248.407770978705, 88.6447398615722,         411.269807120236, 81.4798921330783, 188.28918670832,         267.280783582149, 187.445431206207, 73.64685657876, 199.429682881866,         224.252646280898, 74.3201507754609, 215.713069968094,         80.3524667794354, 394.901959698433, 272.65021607873,         300.104798823333, 175.269496016929, 294.074877903562,         157.631993245592, 294.928403875773, 172.930604207787,         281.859797557782, 308.057739102433, 304.651421825506,         203.999586717006, 209.446084545036, 61.3640318598119,         237.751639761399, 295.329343488992, 74.3201507754609,         204.54473234676, 200.364503950774, 323.030767071796,         423.438192850874, 437.184454844384, 120.296376393409,         317.945238660201, 197.568036037276, 258.593531761033,         273.964450188752, 65.8400799134835, 270.371552245609,         187.346238144356, 272.610746845588, 104.474498383208,         304.847219224635, 206.524004136853, 339.243829355153,         232.677302254895, 160.31612967839, 286.541893008471,         211.67147096112, 190.426344151549, 199.93565580486, 278.351789007742,         191.022039452411, 122.478881104246, 341.231468265994,         357.207679711786, 220.698506741914, 279.226936776433,         217.069578497678, 48.9954963309587, 260.836725964713,         286.810110865952, 176.226201112073, 205.521203563467,         126.210633354179, 194.107074136245, 246.139057427705,         95.8143417881473, 113.417040515303, 382.253716932511,         159.207836128572, 107.510876484036, 307.146927666191,         389.405220506214, 367.652724442945, 241.234525974718,         251.262727774346, 309.348866813642, 361.41766862292,         276.855178000751, 263.460558490522, 246.049280260949,         277.151179701652, 256.700184403488, 192.474358841219,         211.708621118181, 243.816882020045, 317.86582825159,         202.587106844091, 194.599326308708, 283.907869130949,         144.857354906988, 220.012397958602, 277.544194229327,         186.755275028038, 326.898097485705, 158.110698673579,         153.103350690584, 196.620717658539, 73.2388353026197,         211.717895523431, 279.560524664055, 226.709225340858,         220.412938026458, 326.05385212392), leiden_clus = c(4,         2, 1, 1, 2, 3, 2, 1, 2, 1, 1, 1, 1, 3, 3, 1, 2, 1, 4,         2, 1, 1, 1, 1, 3, 3, 2, 3, 5, 2, 1, 5, 2, 4, 1, 3, 1,         2, 1, 2, 4, 3, 3, 4, 1, 3, 4, 2, 3, 1, 1, 3, 2, 1, 2,         2, 1, 2, 3, 4, 3, 1, 3, 2, 3, 1, 2, 4, 1, 1, 2, 4, 2,         3, 2, 1, 4, 2, 1, 4, 1, 2, 3, 2, 1, 2, 2, 1, 1, 1, 4,         4, 4, 4, 4, 3, 1, 2, 3, 1, 3, 3, 3, 2, 3, 4, 1, 2, 2,         1, 4, 1, 1, 2, 2, 2, 2, 4, 4, 4, 3, 4, 2, 3, 2, 4, 4,         1, 1, 2, 4, 2, 4, 4, 3, 3, 2, 4, 3, 3, 4, 5, 1, 4, 2,         1, 4, 2, 3, 2, 1, 1, 2, 1, 3, 1, 1, 3, 4, 3, 1, 1, 2,         2, 4, 3, 4, 1, 4, 1, 2, 1, 1, 2, 1, 2, 4, 2, 1, 4, 4,         1, 3, 3, 1, 2, 1, 2, 2, 4, 4, 3, 5, 2, 1, 1, 2, 1, 1,         3, 3, 2, 3, 1, 2, 2, 1, 1, 2, 3, 1, 3, 1, 3, 2, 1, 3,         5, 4, 2, 4, 4, 1, 3, 2, 1, 3, 1, 3, 2, 3, 3, 4, 3, 2,         4, 2, 1, 1, 3, 1, 4, 4, 4, 5, 4, 2, 4, 3, 4, 2, 4, 1,         3, 3, 1, 3, 2, 5, 2, 2, 1, 3, 4, 1, 2, 4, 2, 1, 1, 3,         2, 1, 1, 3, 1, 1, 3, 2, 3, 2, 1, 2, 2, 4, 1, 1, 1, 2,         3, 4, 1, 1, 3, 1, 2, 4, 3, 3, 4, 1, 3, 3, 1, 2, 3, 2,         4, 3, 1, 4, 5, 3, 1, 4, 2, 4, 3, 3, 2, 1, 2, 4, 2, 1,         2, 3, 2, 3, 3, 1, 2, 1, 1, 4, 3, 4, 4, 2, 1, 2, 3, 4,         1, 2, 1, 4, 5, 1, 1, 3, 2, 1, 4, 3, 3, 1, 3, 5, 1, 2,         3, 4, 3, 3, 3, 2, 2, 1, 1, 5, 2, 4, 1, 4, 1, 3, 1, 5,         1, 2, 2, 3, 3, 5, 2, 2, 1, 2, 4, 1, 2, 3, 4, 4, 1, 3,         1, 3, 3, 2, 2, 2, 2, 1, 3, 2, 4, 3, 4, 5, 1, 1, 1, 1,         2, 3, 1, 1, 2, 2, 5, 4, 1, 2, 5, 4, 2, 4, 1, 1, 1, 1,         2, 1, 1, 5, 2, 5, 1, 2, 4, 3, 2, 2, 2, 3, 1, 2, 1, 1,         2, 1, 2, 4, 4, 4, 2, 2, 4, 3, 1), louvain_clus = c(15,         10, 22, 24, 0, 13, 3, 2, 3, 21, 19, 21, 21, 13, 28, 2,         10, 24, 8, 11, 22, 21, 21, 24, 13, 21, 18, 4, 6, 3, 2,         6, 14, 15, 21, 12, 21, 0, 24, 3, 9, 12, 28, 9, 29, 20,         9, 0, 13, 2, 22, 4, 18, 21, 3, 0, 21, 0, 20, 9, 23, 24,         28, 18, 16, 24, 10, 8, 27, 29, 10, 15, 3, 28, 3, 27,         15, 11, 21, 8, 24, 1, 20, 18, 24, 14, 5, 24, 27, 29,         7, 8, 9, 8, 7, 16, 24, 14, 4, 19, 28, 13, 16, 5, 4, 9,         24, 5, 0, 2, 9, 26, 26, 10, 11, 1, 14, 7, 17, 15, 13,         7, 14, 28, 5, 7, 7, 27, 22, 14, 9, 14, 7, 17, 28, 23,         14, 17, 4, 28, 8, 6, 2, 17, 5, 19, 8, 14, 28, 18, 19,         26, 3, 24, 23, 26, 26, 28, 7, 16, 4, 26, 10, 10, 9, 4,         17, 2, 8, 27, 0, 26, 21, 3, 2, 11, 17, 0, 26, 17, 7,         29, 13, 28, 24, 14, 2, 0, 5, 7, 8, 12, 6, 10, 21, 21,         3, 21, 21, 28, 20, 18, 12, 21, 10, 3, 24, 23, 5, 13,         19, 28, 24, 28, 0, 27, 28, 6, 15, 0, 8, 7, 27, 16, 3,         2, 12, 2, 16, 3, 13, 16, 15, 28, 5, 8, 0, 25, 21, 20,         24, 17, 8, 7, 6, 15, 0, 17, 16, 15, 3, 9, 25, 16, 20,         24, 4, 14, 6, 10, 3, 21, 16, 17, 21, 10, 8, 18, 24, 23,         4, 3, 21, 2, 16, 19, 24, 12, 18, 28, 5, 27, 14, 0, 8,         26, 21, 2, 14, 16, 15, 25, 24, 16, 21, 5, 17, 12, 16,         15, 24, 12, 28, 24, 14, 12, 10, 7, 12, 24, 7, 6, 13,         19, 7, 5, 8, 23, 28, 5, 24, 0, 7, 5, 19, 1, 13, 14, 12,         4, 22, 10, 2, 27, 9, 16, 8, 9, 18, 19, 1, 28, 8, 19,         0, 22, 15, 6, 19, 26, 20, 10, 21, 15, 28, 16, 21, 16,         6, 22, 14, 12, 7, 12, 16, 16, 14, 18, 2, 24, 6, 3, 15,         19, 17, 26, 13, 21, 6, 2, 14, 11, 28, 16, 6, 11, 1, 26,         3, 9, 19, 5, 13, 17, 8, 29, 28, 24, 16, 13, 5, 0, 5,         10, 24, 12, 11, 15, 20, 7, 6, 21, 25, 2, 22, 3, 23, 2,         23, 0, 11, 6, 17, 2, 0, 6, 9, 18, 15, 22, 26, 24, 21,         3, 21, 27, 6, 3, 6, 27, 5, 15, 28, 3, 0, 3, 4, 29, 0,         21, 2, 11, 2, 11, 9, 7, 17, 3, 5, 15, 13, 26), sdimx = c(6637.8808812838,         6471.97820589227, 6801.60964850244, 6789.05500292697,         6807.65042853937, 6823.00666161112, 6714.59974529393,         6893.67783391626, 6553.150314616, 6820.08645751904, 6710.3427827623,         6739.78164732464, 6789.48587843314, 6778.54269420933,         6844.85239392872, 6898.05484110887, 6456.65141488127,         6757.4307452351, 6543.67833565009, 6572.06455004792,         6771.80635804563, 6759.5864935999, 6752.30540722853,         6775.25860580127, 6898.72948587473, 6823.30553732925,         6835.93295576951, 6808.32562760623, 6807.59540821274,         6626.74053986698, 6785.48528357164, 6860.1753773801,         6522.97161083555, 6708.60071737893, 6749.98064221693,         6839.38412177152, 6765.85070030091, 6799.28167698505,         6749.75681156924, 6718.69339489712, 6479.53753434238,         6760.63434678639, 6768.56273348601, 6510.6756138787,         6784.06721565658, 6798.53565464916, 6517.32762826806,         6731.51009836197, 6870.42074123265, 6767.81233215594,         6799.14075605756, 6772.10766997861, 6696.10400968722,         6801.32501450403, 6775.1509509065, 6510.02281860262,         6826.86577064758, 6739.96362344898, 6831.17627694285,         6510.40888467799, 6806.63351217732, 6763.37838204693,         6781.12488652313, 6869.4921850741, 6849.99750529545,         6807.49801037505, 6454.18987503524, 6580.49679622108,         6770.00682430453, 6782.2840224775, 6517.29734144982,         6532.82010113957, 6851.48884406439, 6763.23603178364,         6858.74323119609, 6830.0976445797, 6512.25207934776,         6532.88577809432, 6796.50192055237, 6597.58049270394,         6776.10985974505, 6693.06440982343, 6788.14208578427,         6682.5354138913, 6764.62190267229, 6455.89524639721,         6460.39740529794, 6754.37729766093, 6777.4498230528,         6808.39460226196, 6466.17729800694, 6478.41312627396,         6509.39279829524, 6456.24923413553, 6664.07390145898,         6825.03012838374, 6790.95779215364, 6587.74143572423,         6884.28287656967, 6706.41388764739, 6803.47927057151,         6784.44709896399, 6854.33475571524, 6587.73968731755,         6767.28652188796, 6440.97057177281, 6780.18760913751,         6676.98656323604, 6858.30315161028, 6859.57592410636,         6505.33171888625, 6798.40575517887, 6784.31563396794,         6863.67706523351, 6465.42140879191, 6557.85828613334,         6685.12313592863, 6521.18922664088, 6555.52840274004,         6522.04222388722, 6812.66158566804, 6453.95249634888,         6408.29598531274, 6844.43592172118, 6447.42997763028,         6426.76676639899, 6536.29691848348, 6768.06974851558,         6778.44593715405, 6616.4672244554, 6413.22361303906,         6576.32251618376, 6585.20574997854, 6827.8343821827,         6843.06577421016, 6807.85886062257, 6499.45686273565,         6886.44495251415, 6793.73341847935, 6897.44711432062,         6516.2529098625, 6569.14966704579, 6739.2099994588, 6624.31373001694,         6686.9586561888, 6773.87805360964, 6599.03377697081,         6534.26562372906, 6832.87515222033, 6850.36890717202,         6873.13396914288, 6824.5541062929, 6869.58318795525,         6739.0473396333, 6789.28893323701, 6830.05599197119,         6732.9310295696, 6811.6998899797, 6517.8607242326, 6788.96447766946,         6795.6737814001, 6771.97882094171, 6549.0669877684, 6470.92246396119,         6489.13254585104, 6758.06318267494, 6730.81168947718,         6741.81444919852, 6486.85363819836, 6772.68919367577,         6612.68035177546, 6855.56811645338, 6774.58705042556,         6450.1934515094, 6766.59719732798, 6432.45437585756,         6834.18051546681, 6859.87852717047, 6774.96984098843,         6715.76867828034, 6501.87769380441, 6738.08014049433,         6798.71591799698, 6888.83310334722, 6729.56642467044,         6489.24717902651, 6742.80965038585, 6882.16404289567,         6468.9662279023, 6565.74995648196, 6526.88360379975,         6899.07822421188, 6662.99357175548, 6590.64383245809,         6858.4929367601, 6807.49073067372, 6764.24086835216,         6761.83863372494, 6768.71057726895, 6716.67899891025,         6788.35834322317, 6647.73285159213, 6763.58889290394,         6800.64821073709, 6802.84691562944, 6672.57300144195,         6784.85815985147, 6819.55763821081, 6548.16782772046,         6877.89275732929, 6802.53487330746, 6757.46968231895,         6833.3340109005, 6813.25242664858, 6429.55329001286,         6756.45774144263, 6801.20027301285, 6577.84391972267,         6608.24544010038, 6831.49253681432, 6524.52760806654,         6525.90717172888, 6789.94411347398, 6801.2451308314,         6800.23775506552, 6773.92420449733, 6840.91379943923,         6899.10802819571, 6735.49031912478, 6850.51304968022,         6801.14532777881, 6779.22495979593, 6588.86675197276,         6775.84566384735, 6639.82516872193, 6561.86966339677,         6699.16355640972, 6729.27655335024, 6782.67386556963,         6865.92764956889, 6784.04609862827, 6844.24322869573,         6543.54550871315, 6452.05804294971, 6794.04889337226,         6660.63685409322, 6864.05526534957, 6529.57320945428,         6898.81791151271, 6865.18102085489, 6690.13742891961,         6510.54247596213, 6854.13119355356, 6801.31629806063,         6741.84489287576, 6731.99351351306, 6814.76407459526,         6594.82146838915, 6677.23897148481, 6470.79896316401,         6428.29997907424, 6799.11977528229, 6842.02868824196,         6504.82004769189, 6869.44411531346, 6419.74640708323,         6548.71118059062, 6870.19804539853, 6750.39449710691,         6799.85928614831, 6809.21244616241, 6861.59509410447,         6754.99980352946, 6712.58009570656, 6735.97919833437,         6767.64798191848, 6801.26556819792, 6802.52904978147,         6685.82094181802, 6779.88185293585, 6529.60093198485,         6808.69653969409, 6871.98477787608, 6689.41311120331,         6435.54986054706, 6758.26789596214, 6799.11574431577,         6793.54540760376, 6591.5807771877, 6777.51692236166,         6844.33985130537, 6737.30169336579, 6801.78045001026,         6764.62363137444, 6787.87313085497, 6726.91634950577,         6518.36516651272, 6781.14831251511, 6737.58411448561,         6642.88946867326, 6892.03415839152, 6777.72661274489,         6823.44358894647, 6871.66827565912, 6426.22968054757,         6800.4711643196, 6500.31288569412, 6494.78502658729,         6817.87080139245, 6876.31082279616, 6435.97666877698,         6458.95516939962, 6801.99851996592, 6881.1559764007,         6519.36687413384, 6440.62588216965, 6555.10664625192,         6853.79518986789, 6821.23542974947, 6678.96192082955,         6850.77783737743, 6649.88863977702, 6492.14516842032,         6474.43181810819, 6769.4810079892, 6651.31863175573,         6804.55260640916, 6447.69683060985, 6773.97112079187,         6836.50318719721, 6863.57827276805, 6428.35949425473,         6775.69299390733, 6758.68031757563, 6435.30940946679,         6771.89705076374, 6526.4205497444, 6410.13379190205,         6873.8143615, 6753.39362219295, 6596.14795153153, 6742.08421569516,         6408.33041309149, 6763.29628857126, 6401.41164725267,         6789.1648621624, 6750.30001147355, 6764.24554107655,         6764.17366469671, 6756.55596031586, 6833.41837386796,         6759.7991531175, 6833.965187748, 6509.96725302653, 6806.83272759175,         6797.47374843292, 6784.58982181527, 6891.97501455582,         6452.18171830436, 6771.24963361883, 6571.29071532114,         6845.93930776228, 6558.27064927886, 6794.71826591704,         6552.74782109033, 6653.91490711976, 6436.81367623654,         6722.79543516816, 6893.00715687713, 6830.94665844483,         6427.05634014366, 6744.37847408619, 6630.2031697132,         6810.84160001386, 6584.97609812831, 6889.39027462604,         6778.8192567918, 6872.89858299782, 6519.24631905275,         6845.52765705368, 6534.17420442847, 6544.39729112635,         6859.80573724392, 6877.94856781161, 6447.77160121648,         6437.92285984896, 6744.67130348214, 6851.35419368976,         6703.96168516626, 6506.867827791, 6759.25431119644, 6888.34568181021,         6776.14548756007, 6508.30809884685, 6555.12592839951,         6790.52007240946, 6723.45589953463, 6800.79070177921,         6823.48293447281, 6876.07691011208, 6463.12220981654,         6829.67220654085, 6573.21814565748, 6526.07635978982,         6809.92317447895, 6774.20705203945, 6433.02480933363,         6436.70236368238, 6807.47670476913, 6782.27841126232,         6573.00307979669, 6780.80787059408, 6778.23374306171,         6776.77268374676, 6757.81344138853, 6671.47990721493,         6833.38174399028, 6734.57878725315, 6823.60861822951,         6822.03231482105, 6511.77813190424, 6564.33885649663,         6551.70389674383, 6832.02690965684, 6540.87950608337,         6625.3916855425, 6513.02658902262, 6763.5575551154, 6630.88837193287,         6770.33315334202, 6789.40368378401, 6757.59262156762,         6806.49566287309, 6839.6744532694, 6742.62953845425,         6879.62312744128, 6758.33627233685, 6752.65139079419,         6425.75690418821, 6785.58606133749, 6518.72885742262,         6561.96032187273, 6725.11321130467, 6432.04983144122,         6743.13335660921, 6699.10827518615, 6707.33572631525,         6891.99046099739, 6666.10627891979, 6818.96744095846,         6790.75737780895, 6473.53898534017, 6891.11642769422,         6517.29468970767, 6504.01715000655, 6543.51259947666,         6592.01315015408, 6842.38389646221, 6690.253668883, 6588.77184255177,         6817.54820273631, 6784.84841091947), sdimy = c(-5140.46497114994,         -4883.54134223582, -4968.68532827901, -5105.33838949128,         -4882.14351566701, -5044.71644611277, -5083.32150640799,         -5014.2486722655, -5026.63795293867, -4902.34168388116,         -4989.5196177508, -4945.79102188045, -5079.99451191211,         -5023.52561991349, -5001.33570122864, -4928.12681784464,         -4982.8974670609, -4766.15380725814, -4885.75958224615,         -4923.73072117845, -4805.45002372687, -4861.02159043209,         -5102.48811748831, -5091.955745228, -5028.55552739535,         -5102.01521390368, -5053.10103837861, -5046.6446924895,         -4846.40060014237, -5078.36316282505, -5007.42730055679,         -4714.94865932909, -4726.24199581097, -4768.03313962531,         -4842.02195028251, -5023.45153124811, -4846.01587019219,         -5083.03712618282, -4803.6157205398, -4761.45043880136,         -4988.63653441016, -4864.62863949897, -4827.54542508295,         -5017.97585664221, -5031.83041027342, -4829.4222809246,         -4950.08814225891, -5029.81030722027, -5006.89951450034,         -4931.01325067222, -4720.2187664396, -4839.45612819169,         -5014.11113122586, -4998.80918045424, -5133.94754914081,         -4726.10420145961, -5030.6998290447, -5035.44621724736,         -4823.03062427622, -4995.0219979037, -4961.07045532246,         -4750.7191069336, -4964.16256495894, -4948.88500402858,         -5042.99441985731, -4748.11428470602, -4792.36157899866,         -4851.9066063727, -4792.00211282557, -5110.01496084454,         -4823.85961067457, -4874.82521591293, -4807.91332621483,         -4937.56757884284, -4919.17676177481, -4835.24233672541,         -4872.43274987679, -4793.84017699403, -5056.31160853609,         -4857.06260455018, -5057.36256271671, -4981.10495150324,         -4823.83863344311, -4834.51391359348, -5099.21579125885,         -4976.50461707236, -4889.86883232363, -4917.27129035164,         -5101.84265201089, -4733.51955397269, -5026.51183120958,         -4974.40881818473, -5006.94099114185, -5030.1232692059,         -5048.07549966957, -5026.20457900367, -5028.87306357694,         -4897.01756829583, -4996.77660051584, -5021.95614733888,         -4781.72419397428, -4718.48241123272, -5053.57606013206,         -5015.49907603184, -4706.9925475849, -5064.53028245937,         -4723.70518944041, -4920.26831315649, -4910.81352215076,         -4991.7408044849, -5031.83698155813, -4909.57346697013,         -4743.87007124093, -5069.7274239244, -4957.55783248592,         -5137.59219102735, -5106.02589439126, -4928.68055796159,         -4887.07020940708, -4858.09329452682, -5011.86408619555,         -5055.77956623323, -4970.79369766221, -5079.60161921351,         -4967.56347801658, -5070.18701941369, -4910.57010775179,         -5035.50973394647, -4761.80484045956, -4843.25124554134,         -5109.74681422715, -5071.02693863738, -5115.9457505386,         -5089.65515855047, -5040.19507785982, -4967.94539096633,         -4765.79184485919, -4834.17250257909, -4961.25584370039,         -4945.82032940061, -4988.15021006912, -4887.60508901073,         -4919.45263183835, -4859.70143141437, -4918.20958686969,         -5108.41421451787, -4865.98080732933, -5059.07923520481,         -5011.43715756539, -4947.09884957989, -5024.15261787093,         -5080.83785477965, -4738.08461732174, -4761.83525522876,         -4939.60559075811, -5072.45214499056, -4959.18378270458,         -5075.70321471467, -4938.71801742804, -5063.79629271464,         -4702.40580713398, -4968.16293843744, -5063.32206310271,         -4917.98939541325, -4988.67680705316, -4983.02336718863,         -4856.64873713371, -4746.53014873334, -4938.05451612057,         -5083.43851664734, -5145.74628476498, -5038.15546768358,         -4881.36571353404, -4784.48525632198, -4814.31051405657,         -5015.58063030926, -4802.44322642816, -4791.16244807729,         -4834.42819711355, -4787.52579311812, -4939.06858112763,         -4802.63210177907, -4725.17268488656, -5004.68958812737,         -5103.8979794274, -4870.17389633123, -4798.38923095075,         -4951.01394567289, -4753.65558694182, -4879.94694500216,         -4904.05067344289, -4961.35812994687, -4909.65632573558,         -5045.16449739559, -5087.95217190904, -4700.32590047134,         -5047.07247759898, -4914.00529266375, -4998.08781952655,         -4722.13107115621, -4833.3386755639, -5014.39042819042,         -4893.34204652063, -4710.52643448917, -4757.07969743178,         -5062.73583447444, -4924.36839652694, -5062.58830348938,         -4969.35980893909, -5033.84580918722, -4929.5286399045,         -4870.71273926047, -5080.63321153533, -4932.08171573062,         -4971.39773406239, -4815.88017970346, -5065.47317394791,         -4865.57022425158, -4868.6446101358, -4960.63111059615,         -4877.29295102005, -4938.39265643844, -4973.09111643062,         -5131.4930361678, -4867.83827944791, -4919.96175121166,         -4986.45868435898, -4975.21347652265, -5064.47614695878,         -4789.18795199354, -4771.53415389361, -4914.34670720263,         -5105.30276703443, -5075.23946989579, -4726.85806142533,         -4713.57790273051, -4923.17504648053, -4720.2077724778,         -5130.26169136455, -5040.46893488712, -4957.88716446121,         -4764.61319306823, -4791.77157523726, -5043.14236382492,         -5136.77253040486, -4918.87075536289, -4766.50465632165,         -4886.01328208978, -4992.32383904507, -4872.1289573846,         -4765.6797951542, -4959.43407226416, -5012.57151877622,         -4892.50271141765, -4853.88858672033, -4929.30877231758,         -4989.42991567369, -4717.94501862706, -4908.98636028594,         -4730.49478945514, -4799.19937429203, -5020.75389426402,         -4991.21729117971, -4906.24478082075, -4980.6815828461,         -5047.50092827217, -4850.75792032486, -4822.82184322233,         -4940.26581997496, -4953.80934698563, -4769.92337736622,         -4888.99719837311, -4831.7452970845, -5008.91504519615,         -4785.72623662538, -4870.16788338021, -5074.9179299372,         -5012.00246986651, -5074.75401716441, -4754.95704799547,         -5114.10984010559, -5084.47603121571, -4924.65420980798,         -5057.32571804315, -5060.41114629174, -5143.02871967971,         -4917.67924522716, -4803.59133127351, -4905.7380124186,         -4744.3249837502, -4901.90055583977, -4973.46288543753,         -5114.5102459104, -5006.86281549133, -4770.6109940515,         -4951.68976591828, -4917.47983632214, -4815.4893511754,         -4751.75946424521, -4911.08707040733, -4965.01359037306,         -4783.79383846945, -5117.09695696704, -4990.11328732213,         -4996.29888659659, -5092.00661557138, -4871.03004867188,         -4932.26677085918, -4945.68846122672, -5003.86474970264,         -4992.45247364628, -4755.89299615944, -5087.98320553242,         -5051.98214530585, -4963.92095086285, -4844.6118122532,         -4754.81281623765, -5064.17532961706, -5013.31266142599,         -4762.73738237887, -5034.43346606985, -4747.7641869891,         -4949.04353143474, -4774.96718936366, -5124.6657250152,         -5078.87046955771, -5055.92072329171, -4944.58689155078,         -4853.85952679836, -5066.37589209001, -5013.59461225121,         -5046.57636676208, -5068.74041939879, -4804.96996682535,         -5083.20230471506, -4962.13435322168, -4920.44416883698,         -5095.41996298238, -4940.85354627318, -5132.32218232733,         -4994.94418543743, -4780.99538241368, -4816.50455337949,         -4921.09519122632, -4868.27557615047, -4754.57875632559,         -4718.06206228911, -4734.50003827088, -4779.77592138594,         -5067.05986028661, -4725.08970272579, -4704.30734315889,         -5044.19797884166, -4896.58899654978, -4723.90288922372,         -4783.58164302816, -4802.24346564732, -4958.59489090651,         -4992.4422045741, -4724.5868349102, -5013.78130061489,         -5047.79448750132, -4788.74254841773, -5002.14487017383,         -5125.90533187199, -4962.07665377826, -4937.32675248239,         -4914.40380205778, -4921.99234246068, -5114.99086722141,         -4913.3942431888, -4887.38517280587, -4923.34555762368,         -5005.07864828751, -4996.57684929544, -5029.4682066754,         -4709.03247200102, -5056.14801353278, -5098.14890465806,         -4972.241930019, -4712.23939209788, -4712.77861756158,         -5046.04037057624, -4971.86868649317, -4811.2748209944,         -5026.51653337754, -5028.5458178594, -4835.74664315005,         -5012.02484320738, -5057.94025332013, -4887.86341293176,         -4861.47165603255, -4939.69299471232, -4886.20638193341,         -4894.84005047906, -4951.23267101096, -4746.60885241736,         -4943.5739662077, -5071.68789531465, -5063.92974589223,         -4808.13548419662, -4754.98601891917, -4913.15767599109,         -4763.05303631298, -4922.63587777295, -4847.13918074678,         -5000.51956865682, -4826.83517051366, -4823.71980117696,         -4855.73585100985, -4999.3014392313, -4872.21031913298,         -4901.83694171047, -4865.25567760648, -4903.77095553978,         -4985.36558010038, -4989.77657464806, -4983.55343956176,         -4713.47694718688, -5108.01979111061, -4854.9257363696,         -4872.85839660731, -4713.73542364449, -5022.7266956729,         -5025.32269883117, -4742.87434258278, -5038.44873809766,         -4852.52616693417, -4872.17312011711, -4714.75844260596,         -4890.31811898036, -4974.86439823032, -5032.68115095321,         -4957.33019085832, -4929.79506556741, -5081.79335393027,         -5109.87377140917, -5115.026200686, -4862.82219788435,         -4867.04394661215, -5053.3809309726, -4891.48374151716,         -4971.90481421431, -4814.25419048326, -4873.89126236239,         -4713.20471400574, -4792.61387447891, -4930.41241151074,         -4717.70094526783, -4940.30406463439, -4739.63006992789,         -4934.63137076183, -4938.68613508022, -5136.51121117017,         -5060.56708090763, -4896.65551613293, -5146.74746408943,         -4717.16780023023, -4861.90259230076, -5134.61603236948,         -5030.3265062498, -4942.07637683203)), class = c("data.table",     "data.frame"), row.names = c(NA, -462L), .internal.selfref = <pointer: 0x56542f0b65d0>, sorted = "cell_ID"),     cell_locations_metadata_other = NULL, cell_color = "new",     color_as_factor = TRUE, cell_color_code = NULL, cell_color_gradient = NULL,     gradient_midpoint = NULL, gradient_style = c("divergent",     "sequential"), gradient_limits = NULL, select_cell_groups = NULL,     select_cells = NULL, point_size = 3, point_alpha = 1, show_cluster_center = FALSE,     show_center_label = FALSE, center_point_size = 4, label_size = 4,     label_fontface = "bold", show_other_cells = TRUE, other_cell_color = "lightgrey",     other_point_size = 1, show_legend = FALSE, point_border_stroke = 0.1,     point_border_col = "black", center_point_border_col = "black",     center_point_border_stroke = 0.1): new is not a color or a column name