Browse code

Merge pull request #777 from mingl1997/devel

Bug fixes for various issues

Joshua D. Campbell authored on 14/01/2025 21:32:49 • GitHub committed on 14/01/2025 21:32:49
Showing 5 changed files

... ...
@@ -244,7 +244,7 @@
244 244
 }
245 245
 
246 246
 .runDoubletFinder <- function(counts, seuratPcs, seuratRes, formationRate,
247
-                              seuratNfeatures, verbose = FALSE,
247
+                              seuratNfeatures, sct = FALSE, verbose = FALSE,
248 248
                               nCores = NULL, seed = 12345) {
249 249
   
250 250
   ## Convert to sparse matrix if not already in that format
... ...
@@ -285,7 +285,7 @@
285 285
   )
286 286
   invisible(sweepResListSeurat <- .paramSweep(seurat,
287 287
                                               PCs = seuratPcs,
288
-                                              sct = FALSE,
288
+                                              sct = sct,
289 289
                                               num.cores = nCores,
290 290
                                               verbose = verbose,
291 291
                                               seed = seed
... ...
@@ -306,7 +306,7 @@
306 306
                               pK = pkOptimal,
307 307
                               nExp = nExpPoi,
308 308
                               reuse.pANN = FALSE,
309
-                              sct = FALSE,
309
+                              sct = sct,
310 310
                               verbose = FALSE
311 311
   )
312 312
   names([email protected])[6] <- "doubletFinderAnnScore"
... ...
@@ -331,6 +331,7 @@
331 331
 #' @param seuratRes Numeric vector. The resolution parameter used in Seurat,
332 332
 #' which adjusts the number of clusters determined via the algorithm. Default 
333 333
 #' \code{1.5}.
334
+#' @param sct Whether or not to use SCT. Default \code{FALSE}.
334 335
 #' @param formationRate Doublet formation rate used within algorithm. Default 
335 336
 #' \code{0.075}.
336 337
 #' @param nCores Number of cores used for running the function. Default 
... ...
@@ -355,6 +356,7 @@ runDoubletFinder <- function(inSCE,
355 356
                              seuratNfeatures = 2000,
356 357
                              seuratPcs = seq(15),
357 358
                              seuratRes = 1.5,
359
+                             sct = FALSE,
358 360
                              formationRate = 0.075,
359 361
                              nCores = NULL,
360 362
                              verbose = FALSE) {
... ...
@@ -405,6 +407,7 @@ runDoubletFinder <- function(inSCE,
405 407
           seuratRes = res,
406 408
           seuratNfeatures = seuratNfeatures,
407 409
           formationRate = formationRate,
410
+          sct = sct,
408 411
           nCores = nCores,
409 412
           verbose = verbose,
410 413
           seed = seed
... ...
@@ -86,7 +86,7 @@ runCellQC <- function(inSCE,
86 86
         mitoRef = mitoRef,
87 87
         mitoIDType = mitoIDType,
88 88
         mitoPrefix = mitoPrefix,
89
-        mitoID = mitoID,
89
+        mitoID = list(mitoID),
90 90
         mitoGeneLocation = mitoGeneLocation,
91 91
         paramsList[["QCMetrics"]]))
92 92
   }
... ...
@@ -147,6 +147,7 @@ SCANORAMA
147 147
 SCDS
148 148
 SCE
149 149
 SCEsetObject
150
+SCT
150 151
 SCTK
151 152
 SCTK's
152 153
 SCTransform
... ...
@@ -267,7 +268,6 @@ colorBy
267 268
 colorScheme
268 269
 combineSCE
269 270
 compbiomed
270
-complexed
271 271
 computating
272 272
 computeHeatmap
273 273
 conda
... ...
@@ -2025,7 +2025,7 @@ shinyServer(function(input, output, session) {
2025 2025
       soupXParams[["cluster"]] <- NULL
2026 2026
     }
2027 2027
     # add to master params list
2028
-    paramsList[["decontX"]] = soupXParams
2028
+    paramsList[["soupX"]] = soupXParams
2029 2029
     return(paramsList)
2030 2030
   }
2031 2031
   
... ...
@@ -12,6 +12,7 @@ runDoubletFinder(
12 12
   seuratNfeatures = 2000,
13 13
   seuratPcs = seq(15),
14 14
   seuratRes = 1.5,
15
+  sct = FALSE,
15 16
   formationRate = 0.075,
16 17
   nCores = NULL,
17 18
   verbose = FALSE
... ...
@@ -39,6 +40,8 @@ determine number of clusters. Default \code{1:15}.}
39 40
 which adjusts the number of clusters determined via the algorithm. Default 
40 41
 \code{1.5}.}
41 42
 
43
+\item{sct}{Whether or not to use SCT. Default \code{FALSE}.}
44
+
42 45
 \item{formationRate}{Doublet formation rate used within algorithm. Default 
43 46
 \code{0.075}.}
44 47