Browse code

Moved Matrix and SingleCellExperiment to Depends to make sure these are loaded when using celda

Joshua D. Campbell authored on 25/03/2022 20:25:48
Showing 3 changed files

... ...
@@ -14,15 +14,15 @@ Description: Celda is a suite of Bayesian hierarchical models for
14 14
     Bayesian method to computationally estimate and remove RNA contamination in
15 15
     individual cells without empty droplet information. A variety of scRNA-seq
16 16
     data visualization functions is also included.
17
-Depends: R (>= 4.0)
17
+Depends: R (>= 4.0), SingleCellExperiment, Matrix
18 18
 VignetteBuilder: knitr
19 19
 Imports: plyr, foreach, ggplot2, RColorBrewer, grid, scales, gtable,
20 20
         grDevices, graphics, matrixStats, doParallel, digest, methods,
21 21
         reshape2, S4Vectors, data.table,
22 22
         Rcpp, RcppEigen, uwot, enrichR, SummarizedExperiment,
23 23
         MCMCprecision, ggrepel, Rtsne, withr,
24
-        scater (>= 1.14.4), scran, SingleCellExperiment, dbscan,
25
-        DelayedArray, stringr, Matrix, ComplexHeatmap, multipanelfigure,
24
+        scater (>= 1.14.4), scran, dbscan,
25
+        DelayedArray, stringr, ComplexHeatmap, multipanelfigure,
26 26
         circlize
27 27
 Suggests: testthat, knitr, roxygen2, rmarkdown, biomaRt, covr,
28 28
         BiocManager, BiocStyle, TENxPBMCData, singleCellTK, M3DExampleData
... ...
@@ -125,6 +125,7 @@ import(grDevices)
125 125
 import(graphics)
126 126
 import(grid)
127 127
 import(uwot)
128
+importClassesFrom(SingleCellExperiment,SingleCellExperiment)
128 129
 importFrom(MCMCprecision,fit_dirichlet)
129 130
 importFrom(Matrix,colSums)
130 131
 importFrom(Matrix,rowSums)
... ...
@@ -144,6 +144,8 @@ setGeneric("decontX", function(x, ...) standardGeneric("decontX"))
144 144
 
145 145
 #' @export
146 146
 #' @rdname decontX
147
+#' @importClassesFrom SingleCellExperiment SingleCellExperiment
148
+#' @importClassesFrom Matrix dgCMatrix
147 149
 setMethod("decontX", "SingleCellExperiment", function(x,
148 150
                                                       assayName = "counts",
149 151
                                                       z = NULL,