Browse code

resolve package import conflicts

zhewa authored on 21/03/2019 17:31:57
Showing 5 changed files

... ...
@@ -77,15 +77,18 @@ exportMethods(perplexity)
77 77
 exportMethods(resList)
78 78
 exportMethods(runParams)
79 79
 exportMethods(sampleLabel)
80
+import(MAST, except = c(combine))
80 81
 import(RColorBrewer)
81 82
 import(Rcpp)
82 83
 import(RcppEigen)
84
+import(SummarizedExperiment, except = c(shift, rowRanges))
83 85
 import(data.table)
84 86
 import(foreach)
85 87
 import(grDevices)
86 88
 import(graphics)
87 89
 import(grid)
88 90
 import(gridExtra)
91
+import(gridExtra, except = c(combine))
89 92
 import(gtable)
90 93
 import(matrixStats, except = c(count))
91 94
 import(plyr)
... ...
@@ -24,6 +24,7 @@
24 24
 #' celda.mod = celda_C(celda.C.sim$counts, K=celda.C.sim$K, 
25 25
 #'                     sample.label=celda.C.sim$sample.label)
26 26
 #' @import Rcpp RcppEigen
27
+#' @rawNamespace import(gridExtra, except = c(combine))
27 28
 #' @export
28 29
 celda_C = function(counts, sample.label=NULL, K, alpha=1, beta=1,
29 30
   					        algorithm = c("EM", "Gibbs"), 
... ...
@@ -30,6 +30,7 @@
30 30
 #' celda.mod = celda_CG(celda.CG.sim$counts, K=celda.CG.sim$K, L=celda.CG.sim$L,
31 31
 #'                      sample.label=celda.CG.sim$sample.label, nchains=1)
32 32
 #' @import Rcpp RcppEigen
33
+#' @rawNamespace import(gridExtra, except = c(combine))
33 34
 #' @export
34 35
 celda_CG = function(counts, sample.label=NULL, K, L,
35 36
                     alpha=1, beta=1, delta=1, gamma=1, 
... ...
@@ -12,8 +12,9 @@
12 12
 #' @examples
13 13
 #' cluster.diffexp.res = differentialExpression(celda.CG.sim$counts, celda.CG.mod, c1=c(1,2))
14 14
 #' @export
15
-#' @import data.table
16
-#' @import plyr
15
+#' @import data.table plyr
16
+#' @rawNamespace import(MAST, except = c(combine))
17
+#' @rawNamespace import(SummarizedExperiment, except = c(shift, rowRanges))
17 18
 differentialExpression <- function(counts, celda.mod, c1, c2 = NULL, only.pos = FALSE, log2fc.threshold = NULL, fdr.threshold = 1) {
18 19
   if (!is.matrix(counts)) {
19 20
     stop("'counts' should be a numeric count matrix")
20 21
old mode 100755
21 22
new mode 100644