... | ... |
@@ -24,7 +24,7 @@ Suggests: testthat, knitr, roxygen2, rmarkdown, biomaRt, covr, |
24 | 24 |
LinkingTo: Rcpp, RcppEigen |
25 | 25 |
License: MIT + file LICENSE |
26 | 26 |
Encoding: UTF-8 |
27 |
-LazyData: false |
|
27 |
+LazyData: true |
|
28 | 28 |
RoxygenNote: 7.1.1 |
29 | 29 |
BugReports: https://github.com/campbio/celda/issues |
30 | 30 |
biocViews: SingleCell, GeneExpression, Clustering, Sequencing, Bayesian |
... | ... |
@@ -15,6 +15,7 @@ |
15 | 15 |
#' to use. Default "featureSubset". |
16 | 16 |
#' @param value Character vector of cell cluster labels for replacements. Works |
17 | 17 |
#' only if \code{x} is a \linkS4class{SingleCellExperiment} object. |
18 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
18 | 19 |
#' @return One of |
19 | 20 |
#' \itemize{ |
20 | 21 |
#' \item Character vector if \code{x} is a |
... | ... |
@@ -144,6 +145,7 @@ setReplaceMethod("celdaModules", signature(sce = "SingleCellExperiment"), |
144 | 145 |
#' to use. Default "featureSubset". |
145 | 146 |
#' @param value Character vector of sample labels for replacements. Works |
146 | 147 |
#' only is \code{x} is a \linkS4class{SingleCellExperiment} object. |
148 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
147 | 149 |
#' @return Character vector. Contains the sample labels provided at model |
148 | 150 |
#' creation, or those automatically generated by celda. |
149 | 151 |
#' @export |
... | ... |
@@ -201,7 +203,8 @@ setMethod("sampleLabel", |
201 | 203 |
#' @description Retrieves the K/L, model priors (e.g. alpha, beta), |
202 | 204 |
#' and count matrix checksum parameters provided during the creation of the |
203 | 205 |
#' provided celdaModel. |
204 |
-#' @param celdaMod celdaModel. Options available in `celda::availableModels`. |
|
206 |
+#' @param celdaMod celdaModel. Options available in |
|
207 |
+#' \code{celda::availableModels}. |
|
205 | 208 |
#' @return List. Contains the model-specific parameters for the provided celda |
206 | 209 |
#' model object depending on its class. |
207 | 210 |
#' @export |
... | ... |
@@ -262,6 +265,7 @@ setMethod("matrixNames", |
262 | 265 |
#' \code{celdaList}. |
263 | 266 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
264 | 267 |
#' to use. Default "featureSubset". |
268 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
265 | 269 |
#' @return Data Frame. Contains details on the various K/L parameters, chain |
266 | 270 |
#' parameters, seed, and final log-likelihoods derived for each model in the |
267 | 271 |
#' provided celdaList. |
... | ... |
@@ -308,6 +312,7 @@ setMethod("runParams", |
308 | 312 |
#' \code{celdaList}. |
309 | 313 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
310 | 314 |
#' to use. Default "featureSubset". |
315 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
311 | 316 |
#' @return List. Contains one celdaModel object for each of the parameters |
312 | 317 |
#' specified in \code{runParams(x)}. |
313 | 318 |
#' @export |
... | ... |
@@ -354,6 +359,7 @@ setMethod("resList", |
354 | 359 |
#' returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}. |
355 | 360 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
356 | 361 |
#' to use. Default "featureSubset". |
362 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
357 | 363 |
#' @return Character. The celda model. Can be one of "celda_C", "celda_G", or |
358 | 364 |
#' "celda_CG". |
359 | 365 |
#' @examples |
... | ... |
@@ -46,6 +46,7 @@ |
46 | 46 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
47 | 47 |
#' parameter settings and celda model results are stored in the |
48 | 48 |
#' \link[S4Vectors]{metadata} \code{"celda_grid_search"} slot. |
49 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
49 | 50 |
#' @seealso \link{celda_G} for feature clustering, \link{celda_C} for |
50 | 51 |
#' clustering of cells, and \link{celda_CG} for simultaneous clustering of |
51 | 52 |
#' features and cells. \link{subsetCeldaList} can subset the \code{celdaList} |
... | ... |
@@ -444,6 +445,7 @@ setMethod("celdaGridSearch", |
444 | 445 |
#' \linkS4class{SingleCellExperiment} object. Default "counts". |
445 | 446 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
446 | 447 |
#' to use. Default "featureSubset". |
448 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
447 | 449 |
#' @return One of |
448 | 450 |
#' \itemize{ |
449 | 451 |
#' \item A new \linkS4class{SingleCellExperiment} object containing |
... | ... |
@@ -587,6 +589,7 @@ setMethod("subsetCeldaList", |
587 | 589 |
#' \linkS4class{SingleCellExperiment} object. Default "counts". |
588 | 590 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
589 | 591 |
#' to use. Default "featureSubset". |
592 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
590 | 593 |
#' @return One of |
591 | 594 |
#' \itemize{ |
592 | 595 |
#' \item A new \linkS4class{SingleCellExperiment} object containing |
... | ... |
@@ -57,6 +57,7 @@ |
57 | 57 |
#' @param logfile Character. Messages will be redirected to a file named |
58 | 58 |
#' `logfile`. If NULL, messages will be printed to stdout. Default NULL. |
59 | 59 |
#' @param verbose Logical. Whether to print log messages. Default TRUE. |
60 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
60 | 61 |
#' @return A \link[SingleCellExperiment]{SingleCellExperiment} object. Function |
61 | 62 |
#' parameter settings are stored in the \link[S4Vectors]{metadata} |
62 | 63 |
#' \code{"celda_parameters"} slot. |
... | ... |
@@ -69,6 +69,7 @@ |
69 | 69 |
#' @param logfile Character. Messages will be redirected to a file named |
70 | 70 |
#' `logfile`. If NULL, messages will be printed to stdout. Default NULL. |
71 | 71 |
#' @param verbose Logical. Whether to print log messages. Default TRUE. |
72 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
72 | 73 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
73 | 74 |
#' parameter settings are stored in \link[S4Vectors]{metadata} |
74 | 75 |
#' \code{"celda_parameters"} in \link[SingleCellExperiment]{altExp} slot. |
... | ... |
@@ -51,6 +51,7 @@ |
51 | 51 |
#' @param logfile Character. Messages will be redirected to a file named |
52 | 52 |
#' `logfile`. If NULL, messages will be printed to stdout. Default NULL. |
53 | 53 |
#' @param verbose Logical. Whether to print log messages. Default TRUE. |
54 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
54 | 55 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
55 | 56 |
#' parameter settings are stored in the \link[S4Vectors]{metadata} |
56 | 57 |
#' \code{"celda_parameters"} slot. Column \code{celda_feature_module} in |
... | ... |
@@ -238,6 +238,7 @@ recodeClusterY <- function(sce, from, to, altExpName = "featureSubset") { |
238 | 238 |
#' @param celdaMod A \code{celdaModel} or \code{celdaList} object. |
239 | 239 |
#' @param errorOnMismatch Logical. Whether to throw an error in the event of |
240 | 240 |
#' a mismatch. Default TRUE. |
241 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
241 | 242 |
#' @return Returns TRUE if provided count matrix matches the one used in the |
242 | 243 |
#' celda object and/or \code{errorOnMismatch = FALSE}, FALSE otherwise. |
243 | 244 |
#' @export |
... | ... |
@@ -45,6 +45,7 @@ |
45 | 45 |
#' @param seed Integer. Passed to \link[withr]{with_seed}. For reproducibility, |
46 | 46 |
#' a default value of 12345 is used. If NULL, no calls to |
47 | 47 |
#' \link[withr]{with_seed} are made. |
48 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
48 | 49 |
#' @return \code{sce} with t-SNE coordinates |
49 | 50 |
#' (columns "celda_tSNE1" & "celda_tSNE2") added to |
50 | 51 |
#' \code{\link[SingleCellExperiment]{reducedDim}(sce, "celda_tSNE")}. |
... | ... |
@@ -14,6 +14,7 @@ |
14 | 14 |
#' \link[SummarizedExperiment]{assay} slot to use. Default "counts". |
15 | 15 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
16 | 16 |
#' to use. Default "featureSubset". |
17 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
17 | 18 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
18 | 19 |
#' parameter settings are stored in the \link[S4Vectors]{metadata} |
19 | 20 |
#' \code{"celda_parameters"} slot. |
... | ... |
@@ -15,6 +15,7 @@ |
15 | 15 |
#' @param log Logical. If \code{FALSE}, then the normalized conditional |
16 | 16 |
#' probabilities will be returned. If \code{TRUE}, then the unnormalized log |
17 | 17 |
#' probabilities will be returned. Default \code{FALSE}. |
18 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
18 | 19 |
#' @examples |
19 | 20 |
#' data(sceCeldaCG) |
20 | 21 |
#' clusterProb <- clusterProbability(sceCeldaCG, log = TRUE) |
... | ... |
@@ -25,62 +25,61 @@ availableModels <- c("celda_C", "celda_G", "celda_CG") |
25 | 25 |
#' @description celda_CG model object generated from \code{celdaCGSim} using |
26 | 26 |
#' old \code{celda_CG} function. |
27 | 27 |
#' @format A celda_CG object |
28 |
-#' #@examples |
|
29 |
-#' data(celdaCGSim) |
|
30 |
-#' celdaCGMod <- celda_CG(celdaCGSim$counts, |
|
31 |
-#' K = celdaCGSim$K, |
|
32 |
-#' L = celdaCGSim$L, |
|
33 |
-#' nchains = 1) |
|
28 |
+# @examples |
|
29 |
+# data(celdaCGSim) |
|
30 |
+# celdaCGMod <- celda_CG(celdaCGSim$counts, |
|
31 |
+# K = celdaCGSim$K, |
|
32 |
+# L = celdaCGSim$L, |
|
33 |
+# nchains = 1) |
|
34 | 34 |
"celdaCGMod" |
35 | 35 |
|
36 | 36 |
|
37 | 37 |
#' @title celdaCGGridSearchRes |
38 | 38 |
#' @description Example results of old celdaGridSearch on celdaCGSim |
39 | 39 |
#' @format An object as returned from old celdaGridSearch() |
40 |
-#' #@examples |
|
41 |
-#' data(celdaCGSim) |
|
42 |
-#' celdaCGGridSearchRes <- celdaGridSearch(celdaCGSim$counts, |
|
43 |
-#' model = "celda_CG", |
|
44 |
-#' paramsTest = list(K = seq(4, 6), L = seq(9, 11)), |
|
45 |
-#' paramsFixed = list(sampleLabel = celdaCGSim$sampleLabel), |
|
46 |
-#' bestOnly = TRUE, |
|
47 |
-#' nchains = 1, |
|
48 |
-#' cores = 2 |
|
49 |
-#' ) |
|
40 |
+# @examples |
|
41 |
+# data(celdaCGSim) |
|
42 |
+# celdaCGGridSearchRes <- celdaGridSearch(celdaCGSim$counts, |
|
43 |
+# model = "celda_CG", |
|
44 |
+# paramsTest = list(K = seq(4, 6), L = seq(9, 11)), |
|
45 |
+# paramsFixed = list(sampleLabel = celdaCGSim$sampleLabel), |
|
46 |
+# bestOnly = TRUE, |
|
47 |
+# nchains = 1, |
|
48 |
+# cores = 2) |
|
50 | 49 |
"celdaCGGridSearchRes" |
51 | 50 |
|
52 | 51 |
|
53 | 52 |
#' @title celdaCSim |
54 | 53 |
#' @description An old example simulated count matrix from the celda_C model. |
55 | 54 |
#' @format A list of counts and properties as returned from old simulateCells(). |
56 |
-#' #@examples |
|
57 |
-#' celdaCSim <- simulateCells("celda_C") |
|
55 |
+# @examples |
|
56 |
+# celdaCSim <- simulateCells("celda_C") |
|
58 | 57 |
"celdaCSim" |
59 | 58 |
|
60 | 59 |
|
61 | 60 |
#' @title celdaCMod |
62 | 61 |
#' @description Old celda_C results generated from celdaCSim |
63 | 62 |
#' @format A celda_C object |
64 |
-#' #@examples |
|
65 |
-#' data(celdaCSim) |
|
66 |
-#' celdaCMod <- celda_C(celdaCSim$counts, K = celdaCSim$K, nchains = 1) |
|
63 |
+# @examples |
|
64 |
+# data(celdaCSim) |
|
65 |
+# celdaCMod <- celda_C(celdaCSim$counts, K = celdaCSim$K, nchains = 1) |
|
67 | 66 |
"celdaCMod" |
68 | 67 |
|
69 | 68 |
|
70 | 69 |
#' @title celdaGSim |
71 | 70 |
#' @description An old example simulated count matrix from the celda_G model. |
72 | 71 |
#' @format A list of counts and properties as returned from old simulateCells() |
73 |
-#' #@examples |
|
74 |
-#' celdaGSim <- simulateCells("celda_G") |
|
72 |
+# @examples |
|
73 |
+# celdaGSim <- simulateCells("celda_G") |
|
75 | 74 |
"celdaGSim" |
76 | 75 |
|
77 | 76 |
|
78 | 77 |
#' @title celdaGMod |
79 | 78 |
#' @description Old celda_G results generated from celdaGsim |
80 | 79 |
#' @format A celda_G object |
81 |
-#' #@examples |
|
82 |
-#' data(celdaGSim) |
|
83 |
-#' celdaGMod <- celda_G(celdaGSim$counts, L = celdaGSim$L, nchains = 1) |
|
80 |
+# @examples |
|
81 |
+# data(celdaGSim) |
|
82 |
+# celdaGMod <- celda_G(celdaGSim$counts, L = celdaGSim$L, nchains = 1) |
|
84 | 83 |
"celdaGMod" |
85 | 84 |
|
86 | 85 |
|
... | ... |
@@ -27,6 +27,7 @@ |
27 | 27 |
#' @param fdrThreshold Numeric. A number between 0 and 1 that specifies the |
28 | 28 |
#' false discovery rate (FDR) threshold. Only features below this threshold |
29 | 29 |
#' will be returned. Default 1. |
30 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
30 | 31 |
#' @return Data frame containing MAST results including statistics such as |
31 | 32 |
#' p-value, log2 fold change, and FDR. |
32 | 33 |
#' @export |
... | ... |
@@ -26,6 +26,7 @@ |
26 | 26 |
#' returns the posterior estimates which include the addition of the Dirichlet |
27 | 27 |
#' concentration parameter (essentially as a pseudocount). Default |
28 | 28 |
#' \code{"counts"}. |
29 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
29 | 30 |
#' @export |
30 | 31 |
setGeneric("factorizeMatrix", |
31 | 32 |
function(x, celdaMod, ...) { |
... | ... |
@@ -12,6 +12,7 @@ |
12 | 12 |
#' to use. Default "featureSubset". |
13 | 13 |
#' @param exactMatch Logical. Whether to look for exactMatch of the gene name |
14 | 14 |
#' within counts matrix. Default \code{TRUE}. |
15 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
15 | 16 |
#' @return List. Each entry corresponds to the feature module determined for |
16 | 17 |
#' the provided features. |
17 | 18 |
#' @export |
... | ... |
@@ -47,6 +47,7 @@ |
47 | 47 |
#' cluster that includes several clusters within it. Default is TRUE. |
48 | 48 |
#' @param seed Numeric. Seed used to enable reproducible UMAP results |
49 | 49 |
#' for identifying metaclusters. Default is 12345. |
50 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
50 | 51 |
#' @return A named list with six elements: |
51 | 52 |
#' \itemize{ |
52 | 53 |
#' \item rules - A named list with one data frame for every label. Each |
... | ... |
@@ -20,6 +20,7 @@ |
20 | 20 |
#' @param fdr False discovery rate (FDR). Numeric. Cutoff value for adjusted |
21 | 21 |
#' p-value, terms with FDR below this value are considered significantly |
22 | 22 |
#' enriched. |
23 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
23 | 24 |
#' @return List of length 'L' where each member contains the significantly |
24 | 25 |
#' enriched terms for the corresponding module. |
25 | 26 |
#' @importFrom enrichR enrichr |
... | ... |
@@ -11,6 +11,7 @@ |
11 | 11 |
#' to use. Default "featureSubset". |
12 | 12 |
#' @param celdaMod celda model object. Ignored if \code{x} is a |
13 | 13 |
#' \linkS4class{SingleCellExperiment} object. |
14 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
14 | 15 |
#' @return The log-likelihood of the cluster assignment for the |
15 | 16 |
#' provided \linkS4class{SingleCellExperiment}. |
16 | 17 |
#' @seealso `celda_C()` for clustering cells |
... | ... |
@@ -155,6 +156,7 @@ setMethod("logLikelihood", signature(x = "matrix", celdaMod = "celda_CG"), |
155 | 156 |
#' model object. |
156 | 157 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
157 | 158 |
#' to use. Default "featureSubset". |
159 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
158 | 160 |
#' @return Numeric. The log-likelihood at each step of Gibbs sampling used to |
159 | 161 |
#' generate the model. |
160 | 162 |
#' @export |
... | ... |
@@ -200,11 +202,12 @@ setMethod("logLikelihoodHistory", |
200 | 202 |
#' sampling used to generate a celdaModel. |
201 | 203 |
#' @return Numeric. The log-likelihood at the final step of Gibbs sampling used |
202 | 204 |
#' to generate the model. |
203 |
-#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
|
204 |
-#' to use. Default "featureSubset". |
|
205 | 205 |
#' @param x A \linkS4class{SingleCellExperiment} object |
206 | 206 |
#' returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}, or a celda |
207 | 207 |
#' model object. |
208 |
+#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
|
209 |
+#' to use. Default "featureSubset". |
|
210 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
208 | 211 |
#' @export |
209 | 212 |
setGeneric( |
210 | 213 |
"bestLogLikelihood", |
... | ... |
@@ -15,8 +15,6 @@ |
15 | 15 |
#' \linkS4class{SingleCellExperiment} object. Default "counts". |
16 | 16 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
17 | 17 |
#' to use. Default "featureSubset". |
18 |
-#' @param celdaMod Celda object of class \link{celda_G} or \link{celda_CG}. Used |
|
19 |
-#' only if \code{x} is a matrix object. |
|
20 | 18 |
#' @param featureModule Integer Vector. The featureModule(s) to display. |
21 | 19 |
#' Multiple modules can be included in a vector. Default \code{NULL} which |
22 | 20 |
#' plots all module heatmaps. |
... | ... |
@@ -20,6 +20,7 @@ |
20 | 20 |
#' @param newCounts A new counts matrix used to calculate perplexity. If NULL, |
21 | 21 |
#' perplexity will be calculated for the matrix in \code{useAssay} slot in |
22 | 22 |
#' \code{x}. Default NULL. |
23 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
23 | 24 |
#' @return Numeric. The perplexity for the provided \code{x} (and |
24 | 25 |
#' \code{celdaModel}). |
25 | 26 |
#' @export |
... | ... |
@@ -358,6 +359,7 @@ setMethod( |
358 | 359 |
#' @param seed Integer. Passed to \link[withr]{with_seed}. For reproducibility, |
359 | 360 |
#' a default value of 12345 is used. If NULL, no calls to |
360 | 361 |
#' \link[withr]{with_seed} are made. |
362 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
361 | 363 |
#' @return A \linkS4class{SingleCellExperiment} object or |
362 | 364 |
#' \code{celdaList} object with a \code{perplexity} |
363 | 365 |
#' property, detailing the perplexity of all K/L combinations that appeared in |
... | ... |
@@ -484,6 +486,7 @@ setMethod("resamplePerplexity", |
484 | 486 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
485 | 487 |
#' to use. Default "featureSubset". |
486 | 488 |
#' @param sep Numeric. Breaks in the x axis of the resulting plot. |
489 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
487 | 490 |
#' @return A ggplot plot object showing perplexity as a function of clustering |
488 | 491 |
#' parameters. |
489 | 492 |
#' @export |
... | ... |
@@ -744,6 +747,7 @@ setMethod("plotGridSearchPerplexity", |
744 | 747 |
#' to use. Default "featureSubset". |
745 | 748 |
#' @param sep Numeric. Breaks in the x axis of the resulting plot. |
746 | 749 |
#' @param n Integer. Width of the rolling window. Default 10. |
750 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
747 | 751 |
#' @return A ggplot plot object showing perplexity diferences as a function of |
748 | 752 |
#' clustering parameters. |
749 | 753 |
#' @export |
... | ... |
@@ -39,6 +39,7 @@ |
39 | 39 |
#' number of columns for facet wrap. |
40 | 40 |
#' @param headers Character vector. If `NULL`, the corresponding rownames are |
41 | 41 |
#' used as labels. Otherwise, these headers are used to label the genes. |
42 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
42 | 43 |
#' @param decreasing logical. Specifies the order of plotting the points. |
43 | 44 |
#' If \code{FALSE}, the points will be plotted in increasing order where |
44 | 45 |
#' the points with largest values will be on top. \code{TRUE} otherwise. |
... | ... |
@@ -329,6 +330,7 @@ setMethod("plotDimReduceGrid", |
329 | 330 |
#' the points with largest values will be on top. \code{TRUE} otherwise. |
330 | 331 |
#' If \code{NULL}, no sorting is performed. Points will be plotted in their |
331 | 332 |
#' current order in \code{x}. Default \code{FALSE}. |
333 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
332 | 334 |
#' @return The plot as a ggplot object |
333 | 335 |
#' @export |
334 | 336 |
setGeneric("plotDimReduceFeature", function(x, ...) { |
... | ... |
@@ -601,6 +603,7 @@ setMethod("plotDimReduceFeature", |
601 | 603 |
#' the points with largest values will be on top. \code{TRUE} otherwise. |
602 | 604 |
#' If \code{NULL}, no sorting is performed. Points will be plotted in their |
603 | 605 |
#' current order in \code{x}. Default \code{FALSE}. |
606 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
604 | 607 |
#' @return The plot as a ggplot object |
605 | 608 |
#' @export |
606 | 609 |
setGeneric("plotDimReduceModule", function(x, ...) { |
... | ... |
@@ -1035,6 +1038,7 @@ setMethod("plotDimReduceCluster", |
1035 | 1038 |
#' curve. Default \code{TRUE}. |
1036 | 1039 |
#' @param dotSize Numeric. Size of points if \code{plotDots = TRUE}. |
1037 | 1040 |
#' Default \code{0.1}. |
1041 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
1038 | 1042 |
#' @return Violin plot for each feature, grouped by celda cluster |
1039 | 1043 |
#' @export |
1040 | 1044 |
setGeneric("plotCeldaViolin", function(x, ...) { |
... | ... |
@@ -75,16 +75,16 @@ |
75 | 75 |
|
76 | 76 |
|
77 | 77 |
#' @title Recursive cell splitting |
78 |
-#' @description Uses the `celda_C` model to cluster cells into population for |
|
79 |
-#' range of possible K's. The cell population labels of the previous "K-1" |
|
80 |
-#' model are used as the initial values in the current model with K cell |
|
81 |
-#' populations. The best split of an existing cell population is found to |
|
82 |
-#' create the K-th cluster. This procedure is much faster than randomly |
|
83 |
-#' initializing each model with a different K. If module labels for each |
|
84 |
-#' feature are given in 'yInit', the `celda_CG` model will be used to split |
|
85 |
-#' cell populations based on those modules instead of individual features. |
|
86 |
-#' Module labels will also be updated during sampling and thus may end up |
|
87 |
-#' slightly different than `yInit`. |
|
78 |
+#' @description Uses the \link{celda_C} model to cluster cells into |
|
79 |
+#' population for range of possible K's. The cell population labels of the |
|
80 |
+#' previous "K-1" model are used as the initial values in the current model |
|
81 |
+#' with K cell populations. The best split of an existing cell population is |
|
82 |
+#' found to create the K-th cluster. This procedure is much faster than |
|
83 |
+#' randomly initializing each model with a different K. If module labels for |
|
84 |
+#' each feature are given in 'yInit', the \link{celda_CG} model will be used to |
|
85 |
+#' split cell populations based on those modules instead of individual |
|
86 |
+#' features. Module labels will also be updated during sampling and thus |
|
87 |
+#' may end up slightly different than \code{yInit}. |
|
88 | 88 |
#' @param x A numeric \link{matrix} of counts or a |
89 | 89 |
#' \linkS4class{SingleCellExperiment} |
90 | 90 |
#' with the matrix located in the assay slot under \code{useAssay}. |
... | ... |
@@ -99,24 +99,24 @@ |
99 | 99 |
#' @param initialK Integer. Minimum number of cell populations to try. |
100 | 100 |
#' @param maxK Integer. Maximum number of cell populations to try. |
101 | 101 |
#' @param tempL Integer. Number of temporary modules to identify and use in cell |
102 |
-#' splitting. Only used if `yInit = NULL`. Collapsing features to a relatively |
|
103 |
-#' smaller number of modules will increase the speed of clustering and tend to |
|
104 |
-#' produce better cell populations. This number should be larger than the |
|
105 |
-#' number of true modules expected in the dataset. Default NULL. |
|
102 |
+#' splitting. Only used if \code{yInit = NULL}. Collapsing features to a |
|
103 |
+#' relatively smaller number of modules will increase the speed of clustering |
|
104 |
+#' and tend to produce better cell populations. This number should be larger |
|
105 |
+#' than the number of true modules expected in the dataset. Default NULL. |
|
106 | 106 |
#' @param yInit Integer vector. Module labels for features. Cells will be |
107 |
-#' clustered using the `celda_CG` model based on the modules specified in |
|
108 |
-#' `yInit` rather than the counts of individual features. While the features |
|
109 |
-#' will be initialized to the module labels in `yInit`, the labels will be |
|
110 |
-#' allowed to move within each new model with a different K. |
|
107 |
+#' clustered using the \link{celda_CG} model based on the modules specified in |
|
108 |
+#' \code{yInit} rather than the counts of individual features. While the |
|
109 |
+#' features will be initialized to the module labels in \code{yInit}, the |
|
110 |
+#' labels will be allowed to move within each new model with a different K. |
|
111 | 111 |
#' @param alpha Numeric. Concentration parameter for Theta. Adds a pseudocount |
112 | 112 |
#' to each cell population in each sample. Default 1. |
113 | 113 |
#' @param beta Numeric. Concentration parameter for Phi. Adds a pseudocount to |
114 |
-#' each feature in each cell (if `yInit` is NULL) or to each module in each |
|
115 |
-#' cell population (if `yInit` is set). Default 1. |
|
114 |
+#' each feature in each cell (if \code{yInit} is NULL) or to each module in |
|
115 |
+#' each cell population (if \code{yInit} is set). Default 1. |
|
116 | 116 |
#' @param delta Numeric. Concentration parameter for Psi. Adds a pseudocount |
117 |
-#' to each feature in each module. Only used if `yInit` is set. Default 1. |
|
117 |
+#' to each feature in each module. Only used if \code{yInit} is set. Default 1. |
|
118 | 118 |
#' @param gamma Numeric. Concentration parameter for Eta. Adds a pseudocount |
119 |
-#' to the number of features in each module. Only used if `yInit` is set. |
|
119 |
+#' to the number of features in each module. Only used if \code{yInit} is set. |
|
120 | 120 |
#' Default 1. |
121 | 121 |
#' @param minCell Integer. Only attempt to split cell populations with at |
122 | 122 |
#' least this many cells. |
... | ... |
@@ -130,10 +130,11 @@ |
130 | 130 |
#' \link[withr]{with_seed} are made. |
131 | 131 |
#' @param perplexity Logical. Whether to calculate perplexity for each model. |
132 | 132 |
#' If FALSE, then perplexity can be calculated later with |
133 |
-#' `resamplePerplexity()`. Default TRUE. |
|
133 |
+#' \link{resamplePerplexity}. Default TRUE. |
|
134 | 134 |
#' @param verbose Logical. Whether to print log messages. Default TRUE. |
135 | 135 |
#' @param logfile Character. Messages will be redirected to a file named |
136 |
-#' `logfile`. If NULL, messages will be printed to stdout. Default NULL. |
|
136 |
+#' "logfile". If NULL, messages will be printed to stdout. Default NULL. |
|
137 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
137 | 138 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
138 | 139 |
#' parameter settings and celda model results are stored in the |
139 | 140 |
#' \link[S4Vectors]{metadata} \code{"celda_grid_search"} slot. The models in |
... | ... |
@@ -872,12 +873,13 @@ setMethod("recursiveSplitCell", |
872 | 873 |
#' should be larger than the number of true cell populations expected in the |
873 | 874 |
#' dataset. Default 100. |
874 | 875 |
#' @param zInit Integer vector. Collapse cells to cell populations based on |
875 |
-#' labels in `zInit` and then perform module splitting. If NULL, no |
|
876 |
-#' collapasing will be performed unless `tempK` is specified. Default NULL. |
|
876 |
+#' labels in \code{zInit} and then perform module splitting. If NULL, no |
|
877 |
+#' collapasing will be performed unless \code{tempK} is specified. |
|
878 |
+#' Default NULL. |
|
877 | 879 |
#' @param sampleLabel Vector or factor. Denotes the sample label for each cell |
878 |
-#' (column) in the count matrix. Only used if `zInit` is set. |
|
880 |
+#' (column) in the count matrix. Only used if \code{zInit} is set. |
|
879 | 881 |
#' @param alpha Numeric. Concentration parameter for Theta. Adds a pseudocount |
880 |
-#' to each cell population in each sample. Only used if `zInit` is set. |
|
882 |
+#' to each cell population in each sample. Only used if \code{zInit} is set. |
|
881 | 883 |
#' Default 1. |
882 | 884 |
#' @param beta Numeric. Concentration parameter for Phi. Adds a pseudocount |
883 | 885 |
#' to each feature module in each cell. Default 1. |
... | ... |
@@ -896,10 +898,11 @@ setMethod("recursiveSplitCell", |
896 | 898 |
#' \link[withr]{with_seed} are made. |
897 | 899 |
#' @param perplexity Logical. Whether to calculate perplexity for each model. |
898 | 900 |
#' If FALSE, then perplexity can be calculated later with |
899 |
-#' `resamplePerplexity()`. Default TRUE. |
|
901 |
+#' \link{resamplePerplexity}. Default TRUE. |
|
900 | 902 |
#' @param verbose Logical. Whether to print log messages. Default TRUE. |
901 | 903 |
#' @param logfile Character. Messages will be redirected to a file named |
902 |
-#' `logfile`. If NULL, messages will be printed to stdout. Default NULL. |
|
904 |
+#' "logfile". If NULL, messages will be printed to stdout. Default NULL. |
|
905 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
903 | 906 |
#' @return A \linkS4class{SingleCellExperiment} object. Function |
904 | 907 |
#' parameter settings and celda model results are stored in the |
905 | 908 |
#' \link[S4Vectors]{metadata} \code{"celda_grid_search"} slot. The models in |
... | ... |
@@ -16,6 +16,7 @@ |
16 | 16 |
#' \link[SummarizedExperiment]{assay} slot to use. Default "counts". |
17 | 17 |
#' @param altExpName The name for the \link[SingleCellExperiment]{altExp} slot |
18 | 18 |
#' to use. Default "featureSubset". |
19 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
19 | 20 |
#' @return A \linkS4class{SingleCellExperiment} object with a |
20 | 21 |
#' \code{altExpName} \link[SingleCellExperiment]{altExp} slot. Function |
21 | 22 |
#' parameter settings are stored in the \link[S4Vectors]{metadata} |
... | ... |
@@ -15,6 +15,7 @@ |
15 | 15 |
#' @param seed Integer. Passed to \link[withr]{with_seed}. For reproducibility, |
16 | 16 |
#' a default value of 12345 is used. If NULL, no calls to |
17 | 17 |
#' \link[withr]{with_seed} are made. |
18 |
+#' @param ... Ignored. Placeholder to prevent check warning. |
|
18 | 19 |
#' @return A updated \linkS4class{SingleCellExperiment} object with new |
19 | 20 |
#' feature modules stored in column \code{celda_feature_module} in |
20 | 21 |
#' \code{\link[SummarizedExperiment]{rowData}(x)}. |
... | ... |
@@ -17,6 +17,8 @@ bestLogLikelihood(x, ...) |
17 | 17 |
returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}, or a celda |
18 | 18 |
model object.} |
19 | 19 |
|
20 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
21 |
+ |
|
20 | 22 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
21 | 23 |
to use. Default "featureSubset".} |
22 | 24 |
} |
... | ... |
@@ -6,16 +6,6 @@ |
6 | 6 |
\title{celdaCGGridSearchRes} |
7 | 7 |
\format{ |
8 | 8 |
An object as returned from old celdaGridSearch() |
9 |
-#@examples |
|
10 |
-data(celdaCGSim) |
|
11 |
-celdaCGGridSearchRes <- celdaGridSearch(celdaCGSim$counts, |
|
12 |
- model = "celda_CG", |
|
13 |
- paramsTest = list(K = seq(4, 6), L = seq(9, 11)), |
|
14 |
- paramsFixed = list(sampleLabel = celdaCGSim$sampleLabel), |
|
15 |
- bestOnly = TRUE, |
|
16 |
- nchains = 1, |
|
17 |
- cores = 2 |
|
18 |
-) |
|
19 | 9 |
} |
20 | 10 |
\usage{ |
21 | 11 |
celdaCGGridSearchRes |
... | ... |
@@ -30,6 +30,8 @@ a \link[SingleCellExperiment]{altExp} slot with name \code{altExpName} will |
30 | 30 |
be used. Rows represent features and columns represent cells. |
31 | 31 |
\item Celda model object.}} |
32 | 32 |
|
33 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
34 |
+ |
|
33 | 35 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
34 | 36 |
to use. Default "featureSubset".} |
35 | 37 |
|
... | ... |
@@ -48,6 +48,8 @@ celdaGridSearch(x, ...) |
48 | 48 |
with the matrix located in the assay slot under \code{useAssay}. |
49 | 49 |
Rows represent features and columns represent cells.} |
50 | 50 |
|
51 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
52 |
+ |
|
51 | 53 |
\item{useAssay}{A string specifying the name of the |
52 | 54 |
\link[SummarizedExperiment]{assay} slot to use. Default "counts".} |
53 | 55 |
|
... | ... |
@@ -14,6 +14,8 @@ celdaModel(sce, ...) |
14 | 14 |
\item{sce}{A \link[SingleCellExperiment]{SingleCellExperiment} object |
15 | 15 |
returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}.} |
16 | 16 |
|
17 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
18 |
+ |
|
17 | 19 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
18 | 20 |
to use. Default "featureSubset".} |
19 | 21 |
} |
... | ... |
@@ -23,7 +23,7 @@ celdaProbabilityMap(sce, ...) |
23 | 23 |
clusterRows = FALSE, |
24 | 24 |
clusterColumns = FALSE, |
25 | 25 |
showHeatmapLegend = TRUE, |
26 |
- heatmapLegendParam = list(title = NULL, legend_height = unit(6, "cm")) |
|
26 |
+ heatmapLegendParam = list(title = NULL, legend_height = grid::unit(6, "cm")) |
|
27 | 27 |
) |
28 | 28 |
} |
29 | 29 |
\arguments{ |
... | ... |
@@ -28,6 +28,8 @@ celdaTsne(sce, ...) |
28 | 28 |
\item{sce}{A \linkS4class{SingleCellExperiment} object |
29 | 29 |
returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}.} |
30 | 30 |
|
31 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
32 |
+ |
|
31 | 33 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
32 | 34 |
slot to use. Default "counts".} |
33 | 35 |
|
... | ... |
@@ -59,6 +59,8 @@ with the matrix located in the assay slot under \code{useAssay} in |
59 | 59 |
\code{altExp(x, altExpName)}. |
60 | 60 |
Rows represent features and columns represent cells.} |
61 | 61 |
|
62 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
63 |
+ |
|
62 | 64 |
\item{useAssay}{A string specifying the name of the |
63 | 65 |
\link[SummarizedExperiment]{assay} slot to use. Default "counts".} |
64 | 66 |
|
... | ... |
@@ -69,6 +69,8 @@ with the matrix located in the \link[SummarizedExperiment]{assay} |
69 | 69 |
slot under \code{useAssay} in \code{altExp(x, altExpName)}. |
70 | 70 |
Rows represent features and columns represent cells.} |
71 | 71 |
|
72 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
73 |
+ |
|
72 | 74 |
\item{useAssay}{A string specifying the name of the |
73 | 75 |
\link[SummarizedExperiment]{assay} slot to use. Default "counts".} |
74 | 76 |
|
... | ... |
@@ -56,6 +56,8 @@ celda_G(x, ...) |
56 | 56 |
with the matrix located in the assay slot under \code{useAssay}. |
57 | 57 |
Rows represent features and columns represent cells.} |
58 | 58 |
|
59 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
60 |
+ |
|
59 | 61 |
\item{useAssay}{A string specifying the name of the |
60 | 62 |
\link[SummarizedExperiment]{assay} slot to use. Default "counts".} |
61 | 63 |
|
... | ... |
@@ -46,6 +46,8 @@ using older versions of \code{celda}.} |
46 | 46 |
\code{celdaModel}. Dimensions and MD5 checksum will be checked by |
47 | 47 |
\link{compareCountMatrix}.} |
48 | 48 |
|
49 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
50 |
+ |
|
49 | 51 |
\item{useAssay}{A string specifying the name of the |
50 | 52 |
\link[SummarizedExperiment]{assay} slot to use. Default "counts".} |
51 | 53 |
|
... | ... |
@@ -21,6 +21,8 @@ clusterProbability(sce, ...) |
21 | 21 |
located in the \code{useAssay} assay slot. |
22 | 22 |
Rows represent features and columns represent cells.} |
23 | 23 |
|
24 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
25 |
+ |
|
24 | 26 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
25 | 27 |
slot to use. Default "counts".} |
26 | 28 |
|
... | ... |
@@ -18,6 +18,8 @@ cells.} |
18 | 18 |
|
19 | 19 |
\item{celdaMod}{A \code{celdaModel} or \code{celdaList} object.} |
20 | 20 |
|
21 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
22 |
+ |
|
21 | 23 |
\item{errorOnMismatch}{Logical. Whether to throw an error in the event of |
22 | 24 |
a mismatch. Default TRUE.} |
23 | 25 |
} |
... | ... |
@@ -37,6 +37,8 @@ Rows represent features and columns represent cells. Must contain cluster |
37 | 37 |
labels in \code{celdaClusters(x, altExpName = altExpName)} if \code{x} is a |
38 | 38 |
\linkS4class{SingleCellExperiment} object.} |
39 | 39 |
|
40 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
41 |
+ |
|
40 | 42 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
41 | 43 |
slot to use if \code{x} is a |
42 | 44 |
\link[SingleCellExperiment]{SingleCellExperiment} object. Default "counts".} |
... | ... |
@@ -38,6 +38,8 @@ cells. This matrix should be the same as the one used to generate |
38 | 38 |
\item{celdaMod}{Celda model object. Only works if \code{x} is an integer |
39 | 39 |
counts matrix.} |
40 | 40 |
|
41 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
42 |
+ |
|
41 | 43 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
42 | 44 |
slot to use if \code{x} is a \linkS4class{SingleCellExperiment} object. |
43 | 45 |
Default "counts".} |
... | ... |
@@ -20,6 +20,8 @@ featureModuleLookup(sce, ...) |
20 | 20 |
located in the \code{useAssay} assay slot. |
21 | 21 |
Rows represent features and columns represent cells.} |
22 | 22 |
|
23 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
24 |
+ |
|
23 | 25 |
\item{feature}{Character vector. Identify feature modules for the specified |
24 | 26 |
feature names. \code{feature} must match the rownames of \code{sce}.} |
25 | 27 |
|
... | ... |
@@ -49,6 +49,8 @@ findMarkersTree(x, ...) |
49 | 49 |
with the matrix located in the assay slot under \code{useAssay}. |
50 | 50 |
Rows represent features and columns represent cells.} |
51 | 51 |
|
52 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
53 |
+ |
|
52 | 54 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
53 | 55 |
slot to use if \code{x} is a |
54 | 56 |
\link[SingleCellExperiment]{SingleCellExperiment} object. Default "counts".} |
... | ... |
@@ -25,6 +25,8 @@ with the matrix located in the assay slot under \code{useAssay}. |
25 | 25 |
Rows represent features and columns represent cells. Rownames of the |
26 | 26 |
matrix or \linkS4class{SingleCellExperiment} object should be gene names.} |
27 | 27 |
|
28 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
29 |
+ |
|
28 | 30 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
29 | 31 |
slot to use if \code{x} is a |
30 | 32 |
\linkS4class{SingleCellExperiment} object. Default "counts".} |
... | ... |
@@ -27,6 +27,8 @@ Rows represent features and columns represent cells.} |
27 | 27 |
\item{celdaMod}{celda model object. Ignored if \code{x} is a |
28 | 28 |
\linkS4class{SingleCellExperiment} object.} |
29 | 29 |
|
30 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
31 |
+ |
|
30 | 32 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
31 | 33 |
slot to use. Default "counts".} |
32 | 34 |
|
... | ... |
@@ -17,6 +17,8 @@ logLikelihoodHistory(x, ...) |
17 | 17 |
returned by \link{celda_C}, \link{celda_G}, or \link{celda_CG}, or a celda |
18 | 18 |
model object.} |
19 | 19 |
|
20 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
21 |
+ |
|
20 | 22 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
21 | 23 |
to use. Default "featureSubset".} |
22 | 24 |
} |
... | ... |
@@ -156,9 +156,6 @@ vector of the same length as \code{length(unique(celdaModules(x)))} or |
156 | 156 |
\item{labelJust}{Passed to \link[multipanelfigure]{fill_panel}. |
157 | 157 |
Justification for the label within the interpanel spacing grob to the |
158 | 158 |
top-left of the panel content grob.} |
159 |
- |
|
160 |
-\item{celdaMod}{Celda object of class \link{celda_G} or \link{celda_CG}. Used |
|
161 |
-only if \code{x} is a matrix object.} |
|
162 | 159 |
} |
163 | 160 |
\value{ |
164 | 161 |
A \link[multipanelfigure]{multi_panel_figure} object. |
... | ... |
@@ -10,7 +10,8 @@ params(celdaMod) |
10 | 10 |
\S4method{params}{celdaModel}(celdaMod) |
11 | 11 |
} |
12 | 12 |
\arguments{ |
13 |
-\item{celdaMod}{celdaModel. Options available in `celda::availableModels`.} |
|
13 |
+\item{celdaMod}{celdaModel. Options available in |
|
14 |
+\code{celda::availableModels}.} |
|
14 | 15 |
} |
15 | 16 |
\value{ |
16 | 17 |
List. Contains the model-specific parameters for the provided celda |
... | ... |
@@ -37,6 +37,8 @@ cells. This matrix should be the same as the one used to generate |
37 | 37 |
\item{celdaMod}{Celda model object. Only works if \code{x} is an integer |
38 | 38 |
counts matrix.} |
39 | 39 |
|
40 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
41 |
+ |
|
40 | 42 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
41 | 43 |
slot to use if \code{x} is a \linkS4class{SingleCellExperiment} object. |
42 | 44 |
Default "counts".} |
... | ... |
@@ -32,6 +32,8 @@ plotCeldaViolin(x, ...) |
32 | 32 |
with the matrix located in the assay slot under \code{useAssay}. Rows |
33 | 33 |
represent features and columns represent cells.} |
34 | 34 |
|
35 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
36 |
+ |
|
35 | 37 |
\item{features}{Character vector. Uses these genes for plotting.} |
36 | 38 |
|
37 | 39 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
... | ... |
@@ -60,6 +60,8 @@ plotDimReduceFeature(x, ...) |
60 | 60 |
with the matrix located in the assay slot under \code{useAssay}. Rows |
61 | 61 |
represent features and columns represent cells.} |
62 | 62 |
|
63 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
64 |
+ |
|
63 | 65 |
\item{reducedDimName}{The name of the dimension reduction slot in |
64 | 66 |
\code{reducedDimNames(x)} if \code{x} is a |
65 | 67 |
\linkS4class{SingleCellExperiment} object. Ignored if both \code{dim1} and |
... | ... |
@@ -52,6 +52,8 @@ plotDimReduceGrid(x, ...) |
52 | 52 |
with the matrix located in the assay slot under \code{useAssay}. Each |
53 | 53 |
row of the matrix will be plotted as a separate facet.} |
54 | 54 |
|
55 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
56 |
+ |
|
55 | 57 |
\item{reducedDimName}{The name of the dimension reduction slot in |
56 | 58 |
\code{reducedDimNames(x)} if \code{x} is a |
57 | 59 |
\linkS4class{SingleCellExperiment} object. Ignored if both \code{dim1} and |
... | ... |
@@ -50,6 +50,8 @@ plotDimReduceModule(x, ...) |
50 | 50 |
with the matrix located in the assay slot under \code{useAssay}. Rows |
51 | 51 |
represent features and columns represent cells.} |
52 | 52 |
|
53 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
54 |
+ |
|
53 | 55 |
\item{reducedDimName}{The name of the dimension reduction slot in |
54 | 56 |
\code{reducedDimNames(x)} if \code{x} is a |
55 | 57 |
\linkS4class{SingleCellExperiment} object. Ignored if both \code{dim1} and |
... | ... |
@@ -21,6 +21,8 @@ plotGridSearchPerplexity(x, ...) |
21 | 21 |
\code{"celda_grid_search"} in \code{metadata(x)}. |
22 | 22 |
\item celdaList object.}} |
23 | 23 |
|
24 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
25 |
+ |
|
24 | 26 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
25 | 27 |
to use. Default "featureSubset".} |
26 | 28 |
|
... | ... |
@@ -21,6 +21,8 @@ plotGridSearchPerplexityDiff(x, ...) |
21 | 21 |
\code{"celda_grid_search"} in \code{metadata(x)}. |
22 | 22 |
\item celdaList object.}} |
23 | 23 |
|
24 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
25 |
+ |
|
24 | 26 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
25 | 27 |
to use. Default "featureSubset".} |
26 | 28 |
|
... | ... |
@@ -56,6 +56,8 @@ recursiveSplitCell(x, ...) |
56 | 56 |
with the matrix located in the assay slot under \code{useAssay}. |
57 | 57 |
Rows represent features and columns represent cells.} |
58 | 58 |
|
59 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
60 |
+ |
|
59 | 61 |
\item{useAssay}{A string specifying the name of the |
60 | 62 |
\link[SummarizedExperiment]{assay} |
61 | 63 |
slot to use. Default "counts".} |
... | ... |
@@ -71,29 +73,29 @@ to use. Default "featureSubset".} |
71 | 73 |
\item{maxK}{Integer. Maximum number of cell populations to try.} |
72 | 74 |
|
73 | 75 |
\item{tempL}{Integer. Number of temporary modules to identify and use in cell |
74 |
-splitting. Only used if `yInit = NULL`. Collapsing features to a relatively |
|
75 |
-smaller number of modules will increase the speed of clustering and tend to |
|
76 |
-produce better cell populations. This number should be larger than the |
|
77 |
-number of true modules expected in the dataset. Default NULL.} |
|
76 |
+splitting. Only used if \code{yInit = NULL}. Collapsing features to a |
|
77 |
+relatively smaller number of modules will increase the speed of clustering |
|
78 |
+and tend to produce better cell populations. This number should be larger |
|
79 |
+than the number of true modules expected in the dataset. Default NULL.} |
|
78 | 80 |
|
79 | 81 |
\item{yInit}{Integer vector. Module labels for features. Cells will be |
80 |
-clustered using the `celda_CG` model based on the modules specified in |
|
81 |
-`yInit` rather than the counts of individual features. While the features |
|
82 |
-will be initialized to the module labels in `yInit`, the labels will be |
|
83 |
-allowed to move within each new model with a different K.} |
|
82 |
+clustered using the \link{celda_CG} model based on the modules specified in |
|
83 |
+\code{yInit} rather than the counts of individual features. While the |
|
84 |
+features will be initialized to the module labels in \code{yInit}, the |
|
85 |
+labels will be allowed to move within each new model with a different K.} |
|
84 | 86 |
|
85 | 87 |
\item{alpha}{Numeric. Concentration parameter for Theta. Adds a pseudocount |
86 | 88 |
to each cell population in each sample. Default 1.} |
87 | 89 |
|
88 | 90 |
\item{beta}{Numeric. Concentration parameter for Phi. Adds a pseudocount to |
89 |
-each feature in each cell (if `yInit` is NULL) or to each module in each |
|
90 |
-cell population (if `yInit` is set). Default 1.} |
|
91 |
+each feature in each cell (if \code{yInit} is NULL) or to each module in |
|
92 |
+each cell population (if \code{yInit} is set). Default 1.} |
|
91 | 93 |
|
92 | 94 |
\item{delta}{Numeric. Concentration parameter for Psi. Adds a pseudocount |
93 |
-to each feature in each module. Only used if `yInit` is set. Default 1.} |
|
95 |
+to each feature in each module. Only used if \code{yInit} is set. Default 1.} |
|
94 | 96 |
|
95 | 97 |
\item{gamma}{Numeric. Concentration parameter for Eta. Adds a pseudocount |
96 |
-to the number of features in each module. Only used if `yInit` is set. |
|
98 |
+to the number of features in each module. Only used if \code{yInit} is set. |
|
97 | 99 |
Default 1.} |
98 | 100 |
|
99 | 101 |
\item{minCell}{Integer. Only attempt to split cell populations with at |
... | ... |
@@ -111,10 +113,10 @@ a default value of 12345 is used. If NULL, no calls to |
111 | 113 |
|
112 | 114 |
\item{perplexity}{Logical. Whether to calculate perplexity for each model. |
113 | 115 |
If FALSE, then perplexity can be calculated later with |
114 |
-`resamplePerplexity()`. Default TRUE.} |
|
116 |
+\link{resamplePerplexity}. Default TRUE.} |
|
115 | 117 |
|
116 | 118 |
\item{logfile}{Character. Messages will be redirected to a file named |
117 |
-`logfile`. If NULL, messages will be printed to stdout. Default NULL.} |
|
119 |
+"logfile". If NULL, messages will be printed to stdout. Default NULL.} |
|
118 | 120 |
|
119 | 121 |
\item{verbose}{Logical. Whether to print log messages. Default TRUE.} |
120 | 122 |
} |
... | ... |
@@ -126,16 +128,16 @@ A \linkS4class{SingleCellExperiment} object. Function |
126 | 128 |
\code{celda_CG} if \code{zInit} is set. |
127 | 129 |
} |
128 | 130 |
\description{ |
129 |
-Uses the `celda_C` model to cluster cells into population for |
|
130 |
- range of possible K's. The cell population labels of the previous "K-1" |
|
131 |
- model are used as the initial values in the current model with K cell |
|
132 |
- populations. The best split of an existing cell population is found to |
|
133 |
- create the K-th cluster. This procedure is much faster than randomly |
|
134 |
- initializing each model with a different K. If module labels for each |
|
135 |
- feature are given in 'yInit', the `celda_CG` model will be used to split |
|
136 |
- cell populations based on those modules instead of individual features. |
|
137 |
- Module labels will also be updated during sampling and thus may end up |
|
138 |
- slightly different than `yInit`. |
|
131 |
+Uses the \link{celda_C} model to cluster cells into |
|
132 |
+ population for range of possible K's. The cell population labels of the |
|
133 |
+ previous "K-1" model are used as the initial values in the current model |
|
134 |
+ with K cell populations. The best split of an existing cell population is |
|
135 |
+ found to create the K-th cluster. This procedure is much faster than |
|
136 |
+ randomly initializing each model with a different K. If module labels for |
|
137 |
+ each feature are given in 'yInit', the \link{celda_CG} model will be used to |
|
138 |
+ split cell populations based on those modules instead of individual |
|
139 |
+ features. Module labels will also be updated during sampling and thus |
|
140 |
+ may end up slightly different than \code{yInit}. |
|
139 | 141 |
} |
140 | 142 |
\examples{ |
141 | 143 |
data(sceCeldaCG) |
... | ... |
@@ -56,6 +56,8 @@ recursiveSplitModule(x, ...) |
56 | 56 |
with the matrix located in the assay slot under \code{useAssay}. |
57 | 57 |
Rows represent features and columns represent cells.} |
58 | 58 |
|
59 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
60 |
+ |
|
59 | 61 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
60 | 62 |
slot to use if \code{x} is a |
61 | 63 |
\link[SingleCellExperiment]{SingleCellExperiment} object. Default "counts".} |
... | ... |
@@ -75,14 +77,15 @@ should be larger than the number of true cell populations expected in the |
75 | 77 |
dataset. Default 100.} |
76 | 78 |
|
77 | 79 |
\item{zInit}{Integer vector. Collapse cells to cell populations based on |
78 |
-labels in `zInit` and then perform module splitting. If NULL, no |
|
79 |
-collapasing will be performed unless `tempK` is specified. Default NULL.} |
|
80 |
+labels in \code{zInit} and then perform module splitting. If NULL, no |
|
81 |
+collapasing will be performed unless \code{tempK} is specified. |
|
82 |
+Default NULL.} |
|
80 | 83 |
|
81 | 84 |
\item{sampleLabel}{Vector or factor. Denotes the sample label for each cell |
82 |
-(column) in the count matrix. Only used if `zInit` is set.} |
|
85 |
+(column) in the count matrix. Only used if \code{zInit} is set.} |
|
83 | 86 |
|
84 | 87 |
\item{alpha}{Numeric. Concentration parameter for Theta. Adds a pseudocount |
85 |
-to each cell population in each sample. Only used if `zInit` is set. |
|
88 |
+to each cell population in each sample. Only used if \code{zInit} is set. |
|
86 | 89 |
Default 1.} |
87 | 90 |
|
88 | 91 |
\item{beta}{Numeric. Concentration parameter for Phi. Adds a pseudocount |
... | ... |
@@ -108,12 +111,12 @@ a default value of 12345 is used. If NULL, no calls to |
108 | 111 |
|
109 | 112 |
\item{perplexity}{Logical. Whether to calculate perplexity for each model. |
110 | 113 |
If FALSE, then perplexity can be calculated later with |
111 |
-`resamplePerplexity()`. Default TRUE.} |
|
114 |
+\link{resamplePerplexity}. Default TRUE.} |
|
112 | 115 |
|
113 | 116 |
\item{verbose}{Logical. Whether to print log messages. Default TRUE.} |
114 | 117 |
|
115 | 118 |
\item{logfile}{Character. Messages will be redirected to a file named |
116 |
-`logfile`. If NULL, messages will be printed to stdout. Default NULL.} |
|
119 |
+"logfile". If NULL, messages will be printed to stdout. Default NULL.} |
|
117 | 120 |
} |
118 | 121 |
\value{ |
119 | 122 |
A \linkS4class{SingleCellExperiment} object. Function |
... | ... |
@@ -17,6 +17,8 @@ resList(x, ...) |
17 | 17 |
\item{x}{An object of class \linkS4class{SingleCellExperiment} or |
18 | 18 |
\code{celdaList}.} |
19 | 19 |
|
20 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
21 |
+ |
|
20 | 22 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
21 | 23 |
to use. Default "featureSubset".} |
22 | 24 |
} |
... | ... |
@@ -27,6 +27,8 @@ Rows represent features and columns represent cells. Must contain |
27 | 27 |
"celda_grid_search" slot in \code{metadata(x)} if \code{x} is a |
28 | 28 |
\linkS4class{SingleCellExperiment} object.} |
29 | 29 |
|
30 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
31 |
+ |
|
30 | 32 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
31 | 33 |
slot to use if \code{x} is a |
32 | 34 |
\linkS4class{SingleCellExperiment} object. Default "counts".} |
... | ... |
@@ -17,6 +17,8 @@ runParams(x, ...) |
17 | 17 |
\item{x}{An object of class \linkS4class{SingleCellExperiment} or class |
18 | 18 |
\code{celdaList}.} |
19 | 19 |
|
20 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
21 |
+ |
|
20 | 22 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
21 | 23 |
to use. Default "featureSubset".} |
22 | 24 |
} |
... | ... |
@@ -28,6 +28,8 @@ located in the \code{useAssay} assay slot. |
28 | 28 |
Rows represent features and columns represent cells. |
29 | 29 |
\item A celda model object.}} |
30 | 30 |
|
31 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
32 |
+ |
|
31 | 33 |
\item{altExpName}{The name for the \link[SingleCellExperiment]{altExp} slot |
32 | 34 |
to use. Default "featureSubset".} |
33 | 35 |
|
... | ... |
@@ -26,6 +26,8 @@ selectBestModel(x, ...) |
26 | 26 |
\code{"celda_grid_search"} in \code{metadata(x)}. |
27 | 27 |
\item celdaList object.}} |
28 | 28 |
|
29 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
30 |
+ |
|
29 | 31 |
\item{asList}{\code{TRUE} or \code{FALSE}. Whether to return the |
30 | 32 |
best model as a |
31 | 33 |
\code{celdaList} object or not. If \code{FALSE}, return the best model as a |
... | ... |
@@ -30,6 +30,8 @@ selectFeatures(x, ...) |
30 | 30 |
with the matrix located in the assay slot under \code{useAssay}. |
31 | 31 |
Rows represent features and columns represent cells.} |
32 | 32 |
|
33 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
34 |
+ |
|
33 | 35 |
\item{minCount}{Minimum number of counts required for feature selection.} |
34 | 36 |
|
35 | 37 |
\item{minCell}{Minimum number of cells required for feature selection.} |
... | ... |
@@ -21,6 +21,8 @@ splitModule(x, ...) |
21 | 21 |
with the matrix located in the assay slot under \code{useAssay}. |
22 | 22 |
Rows represent features and columns represent cells.} |
23 | 23 |
|
24 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
25 |
+ |
|
24 | 26 |
\item{useAssay}{A string specifying which \link[SummarizedExperiment]{assay} |
25 | 27 |
slot to use for \code{x}. Default "counts".} |
26 | 28 |
|
... | ... |
@@ -22,6 +22,8 @@ subsetCeldaList(x, ...) |
22 | 22 |
\code{"celda_grid_search"} in \code{metadata(x)}. |
23 | 23 |
\item celdaList object.}} |
24 | 24 |
|
25 |
+\item{...}{Ignored. Placeholder to prevent check warning.} |
|
26 |
+ |
|
25 | 27 |
\item{params}{List. List of parameters used to subset the matching celda |
26 | 28 |
models in list \code{"celda_grid_search"} in \code{metadata(x)}.} |
27 | 29 |
|
... | ... |
@@ -172,7 +172,7 @@ topGenes$names$L1 |
172 | 172 |
The clustering results can be viewed with a heatmap of the normalized counts using the function `celdaHeatmap`. The top `nfeatures` in each module will be selected according to the factorized module probability matrix. |
173 | 173 |
|
174 | 174 |
```{r, eval = TRUE, fig.width = 7, fig.height = 7} |
175 |
-celdaHeatmap(sce = sce, nfeatures = 10) |
|
175 |
+plot(celdaHeatmap(sce = sce, nfeatures = 10)) |
|
176 | 176 |
``` |
177 | 177 |
|
178 | 178 |
## Plotting cell populations with tSNE |
... | ... |
@@ -217,11 +217,11 @@ normCounts <- normalizeCounts(counts = counts(altExp(sce)), scaleFun = scale) |
217 | 217 |
``` |
218 | 218 |
|
219 | 219 |
```{r, fig.width = 8, fig.height = 8} |
220 |
-plotHeatmap(counts = normCounts, |
|
220 |
+plot(plotHeatmap(counts = normCounts, |
|
221 | 221 |
z = celdaClusters(sce), |
222 | 222 |
y = celdaModules(sce), |
223 | 223 |
featureIx = geneIx, |
224 |
- showNamesFeature = TRUE) |
|
224 |
+ showNamesFeature = TRUE)) |
|
225 | 225 |
``` |
226 | 226 |
|
227 | 227 |
# Differential Expression Analysis |
... | ... |
@@ -254,12 +254,12 @@ normCounts <- normalizeCounts(counts = counts(altExp(sce)), scaleFun = scale) |
254 | 254 |
``` |
255 | 255 |
|
256 | 256 |
```{r} |
257 |
-plotHeatmap(counts = normCounts[, celdaClusters(sce) %in% c(1, 2)], |
|
257 |
+plot(plotHeatmap(counts = normCounts[, celdaClusters(sce) %in% c(1, 2)], |
|
258 | 258 |
clusterCell = TRUE, |
259 | 259 |
z = celdaClusters(sce)[celdaClusters(sce) %in% c(1, 2)], |
260 | 260 |
y = celdaModules(sce), |
261 | 261 |
featureIx = diffexpGeneIx, |
262 |
- showNamesFeature = TRUE) |
|
262 |
+ showNamesFeature = TRUE)) |
|
263 | 263 |
``` |
264 | 264 |
|
265 | 265 |
# Identifying the optimal number of cell subpopulations and feature modules |