... | ... |
@@ -78,14 +78,15 @@ exportMethods(runParams) |
78 | 78 |
exportMethods(sampleLabel) |
79 | 79 |
import(Rcpp) |
80 | 80 |
import(RcppEigen) |
81 |
-import(data.table, except = melt) |
|
81 |
+import(SummarizedExperiment) |
|
82 |
+import(data.table, except = c(melt, shift)) |
|
82 | 83 |
import(foreach) |
83 | 84 |
import(ggplot2) |
84 | 85 |
import(grDevices) |
85 | 86 |
import(graphics) |
86 | 87 |
import(grid) |
87 | 88 |
import(gridExtra, except = c(combine)) |
88 |
-import(stats) |
|
89 |
+import(stats, except = c(start, end)) |
|
89 | 90 |
importFrom(MAST,FromMatrix) |
90 | 91 |
importFrom(MAST,summary) |
91 | 92 |
importFrom(MAST,zlm) |
... | ... |
@@ -521,7 +521,7 @@ celda_C <- function(counts, |
521 | 521 |
#' @examples |
522 | 522 |
#' celdaCSim <- simulateCells(model = "celda_C", K = 10) |
523 | 523 |
#' simCounts <- celdaCSim$counts |
524 |
-#' @import stats |
|
524 |
+#' @rawNamespace import(stats, except = c(start, end)) |
|
525 | 525 |
#' @export |
526 | 526 |
simulateCellscelda_C <- function(model, |
527 | 527 |
S = 5, |
... | ... |
@@ -26,7 +26,7 @@ |
26 | 26 |
#' clusterDiffexpRes = differentialExpression(celdaCGSim$counts, |
27 | 27 |
#' celdaCGMod, c1 = c(1, 2)) |
28 | 28 |
#' @export |
29 |
-#' @rawNamespace import(data.table, except = melt) |
|
29 |
+#' @rawNamespace import(data.table, except = c(melt, shift)) |
|
30 | 30 |
#' @importFrom MAST FromMatrix |
31 | 31 |
#' @importFrom MAST zlm |
32 | 32 |
#' @importFrom MAST summary |
... | ... |
@@ -34,6 +34,7 @@ |
34 | 34 |
#' @importFrom SummarizedExperiment assay |
35 | 35 |
#' @importFrom SummarizedExperiment colData |
36 | 36 |
#' @importFrom SummarizedExperiment assayNames |
37 |
+#' @import SummarizedExperiment |
|
37 | 38 |
differentialExpression <- function(counts, |
38 | 39 |
celdaMod, |
39 | 40 |
c1, |
... | ... |
@@ -80,7 +81,7 @@ differentialExpression <- function(counts, |
80 | 81 |
|
81 | 82 |
# explicitly load library SummarizedExperiment due to MAST package |
82 | 83 |
# dependency error |
83 |
- requireNamespace(SummarizedExperiment) |
|
84 |
+ # requireNamespace(SummarizedExperiment) |
|
84 | 85 |
|
85 | 86 |
sca <- suppressMessages(MAST::FromMatrix(log_normalized_mat, cdat)) |
86 | 87 |
cdr2 <- colSums(SummarizedExperiment::assay(sca) > 0) |