Browse code

Minor bug fix

Yichen Wang authored on 29/09/2022 03:02:28
Showing 1 changed files

... ...
@@ -360,7 +360,7 @@ runSoupX <- function(inSCE,
360 360
     out <- SoupX::adjustCounts(sc, method = adjustMethod,
361 361
                                roundToInt = roundToInt, tol = tol, pCut = pCut)
362 362
     message(paste0(date(), " ... Generating UMAP"))
363
-    inSCE <- runQuickUMAP(inSCE, useAssay = useAssay, 
363
+    inSCE <- runQuickUMAP(inSCE, useAssay = useAssay, sample = NULL,
364 364
                           reducedDimName = "sampleUMAP")
365 365
     return(list(sc = sc, out = out,
366 366
                 umap = SingleCellExperiment::reducedDim(inSCE, "sampleUMAP")))