UniformClusters | R Documentation |
This group of functions takes in input a COTAN
object and
handle the task of dividing the dataset into Uniform Clusters, that is
clusters that have an homogeneous genes' expression. This condition is
checked by calculating the GDI
of the cluster and verifying that no
more than a small fraction of the genes have their GDI
level above the
given GDIThreshold
GDIPlot(
objCOTAN,
genes,
condition = "",
statType = "S",
GDIThreshold = 1.43,
GDIIn = NULL
)
cellsUniformClustering(
objCOTAN,
checker = NULL,
GDIThreshold = NaN,
cores = 1L,
maxIterations = 25L,
optimizeForSpeed = TRUE,
deviceStr = "cuda",
initialClusters = NULL,
initialResolution = 0.8,
useDEA = TRUE,
distance = NULL,
genesSel = "HVG_Seurat",
hclustMethod = "ward.D2",
saveObj = TRUE,
outDir = "."
)
checkClusterUniformity(
objCOTAN,
clusterName,
cells,
checker,
cores = 1L,
optimizeForSpeed = TRUE,
deviceStr = "cuda",
saveObj = TRUE,
outDir = "."
)
mergeUniformCellsClusters(
objCOTAN,
clusters = NULL,
checkers = NULL,
GDIThreshold = NaN,
batchSize = 0L,
allCheckResults = data.frame(),
cores = 1L,
optimizeForSpeed = TRUE,
deviceStr = "cuda",
useDEA = TRUE,
distance = NULL,
hclustMethod = "ward.D2",
saveObj = TRUE,
outDir = "."
)
objCOTAN |
a |
genes |
a named |
condition |
a string corresponding to the condition/sample (it is used only for the title). |
statType |
type of statistic to be used. Default is "S": Pearson's chi-squared test statistics. "G" is G-test statistics |
GDIThreshold |
legacy. The threshold level that is used in a
SimpleGDIUniformityCheck. It defaults to |
GDIIn |
when the |
checker |
the object that defines the method and the threshold to discriminate whether a cluster is uniform transcript. See UniformTranscriptCheckers for more details |
cores |
number of cores to use. Default is 1. |
maxIterations |
max number of re-clustering iterations. It defaults to
|
optimizeForSpeed |
Boolean; when |
deviceStr |
On the |
initialClusters |
an existing clusterization to use as starting point: the clusters deemed uniform will be kept and the rest processed as normal |
initialResolution |
a number indicating how refined are the clusters
before checking for uniformity. It defaults to |
useDEA |
Boolean indicating whether to use the DEA to define the distance; alternatively it will use the average Zero-One counts, that is faster but less precise. |
distance |
type of distance to use. Default is |
genesSel |
Decides whether and how to perform the gene-selection. used for the clustering. It is a string indicating one of the following selection methods:
|
hclustMethod |
It defaults is |
saveObj |
Boolean flag; when |
outDir |
an existing directory for the analysis output. The effective output will be paced in a sub-folder. |
clusterName |
the tag of the cluster |
cells |
the cells belonging to the cluster |
clusters |
The clusterization to merge. If not given the last available clusterization will be used, as it is probably the most significant! |
checkers |
a |
batchSize |
Number pairs to test in a single round. If none of them
succeeds the merge stops. Defaults to |
allCheckResults |
An optional |
GDIPlot()
directly evaluates and plots the GDI
for a sample.
cellsUniformClustering()
finds a Uniform clusterizations by
means of the GDI
. Once a preliminary clusterization is obtained from
the Seurat-package
methods, each cluster is checked for uniformity
via the function checkClusterUniformity()
. Once all clusters are
checked, all cells from the non-uniform clusters are pooled together
for another iteration of the entire process, until all clusters are
deemed uniform. In the case only a few cells are left out (\leq
50
), those are flagged as "-1"
and the process is stopped.
checkClusterUniformity()
takes a COTAN
object and a cells'
cluster and checks whether the latter is uniform by looking at the
genes' GDI
distribution. The function runs checkObjIsUniform()
on the
given input checker
mergeUniformCellsClusters()
takes in a uniform
clusterization and iteratively checks whether merging two near clusters
would form a uniform cluster still. Multiple thresholds will be used
from 1.37
up to the given one in order to prioritize merge of the
best fitting pairs.
This function uses the cosine distance to establish the nearest clusters
pairs. It will use the checkClusterUniformity()
function to check
whether the merged clusters are uniform. The function will stop once
no tested pairs of clusters are mergeable after testing all pairs in a
single batch
GDIPlot()
returns a ggplot2
object with a point got each gene,
where on the ordinates are the GDI
levels and on the abscissa are the
average gene expression (log scaled). Also marked are the given threshold
(in red) and the 50\%
and 75\%
quantiles (in blue).
cellsUniformClustering()
returns a list
with 2 elements:
"clusters"
the newly found cluster labels array
"coex"
the associated COEX
data.frame
checkClusterUniformity
returns a checker object of the same type
as the input one, that contains both threshold and results of the check:
see UniformTranscriptCheckers for more details
a list
with:
"clusters"
the merged cluster labels array
"coex"
the associated COEX
data.frame
data("test.dataset")
objCOTAN <- automaticCOTANObjectCreation(raw = test.dataset,
GEO = "S",
sequencingMethod = "10X",
sampleCondition = "Test",
cores = 6L,
saveObj = FALSE)
groupMarkers <- list(G1 = c("g-000010", "g-000020", "g-000030"),
G2 = c("g-000300", "g-000330"),
G3 = c("g-000510", "g-000530", "g-000550",
"g-000570", "g-000590"))
gdiPlot <- GDIPlot(objCOTAN, genes = groupMarkers, cond = "test")
plot(gdiPlot)
## Here we override the default checker as a way to reduce the number of
## clusters as higher thresholds imply less stringent uniformity checks
##
## In real applications it might be appropriate to do so in the cases when
## the wanted resolution is lower such as in the early stages of the analysis
##
checker <- new("AdvancedGDIUniformityCheck")
identical(checker@firstCheck@GDIThreshold, 1.297)
checker2 <- shiftCheckerThresholds(checker, 0.1)
identical(checker2@firstCheck@GDIThreshold, 1.397)
splitList <- cellsUniformClustering(objCOTAN, cores = 6L,
optimizeForSpeed = TRUE,
deviceStr = "cuda",
initialResolution = 0.8,
checker = checker2, saveObj = FALSE)
clusters <- splitList[["clusters"]]
firstCluster <- getCells(objCOTAN)[clusters %in% clusters[[1L]]]
checkerRes <-
checkClusterUniformity(objCOTAN, checker = checker2,
cluster = clusters[[1L]], cells = firstCluster,
cores = 6L, optimizeForSpeed = TRUE,
deviceStr = "cuda", saveObj = FALSE)
objCOTAN <- addClusterization(objCOTAN,
clName = "split",
clusters = clusters,
coexDF = splitList[["coex"]],
override = FALSE)
identical(reorderClusterization(objCOTAN)[["clusters"]], clusters)
## It is possible to pass a list of checkers tot the merge function that will
## be applied each to the *resulting* merged *clusterization* obtained using
## the previous checker. This ensures that the most similar clusters are
## merged first improving the overall performance
mergedList <- mergeUniformCellsClusters(objCOTAN,
checkers = c(checker, checker2),
batchSize = 2L,
clusters = clusters,
cores = 6L,
optimizeForSpeed = TRUE,
deviceStr = "cpu",
distance = "cosine",
hclustMethod = "ward.D2",
saveObj = FALSE)
objCOTAN <- addClusterization(objCOTAN,
clName = "merged",
clusters = mergedList[["clusters"]],
coexDF = mergedList[["coex"]],
override = TRUE)
identical(reorderClusterization(objCOTAN), mergedList[["clusters"]])
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.