Browse code

Replaced donttest with dontrun to fix notes. Added missing package reference

Joshua D. Campbell authored on 07/07/2021 20:10:08
Showing 5 changed files

... ...
@@ -55,7 +55,7 @@
55 55
 #' @importFrom doParallel registerDoParallel
56 56
 #' @importFrom methods is
57 57
 #' @examples
58
-#' \donttest{
58
+#' \dontrun{
59 59
 #' data(celdaCGSim)
60 60
 #' ## Run various combinations of parameters with 'celdaGridSearch'
61 61
 #' celdaCGGridSearchRes <- celdaGridSearch(celdaCGSim$counts,
... ...
@@ -563,7 +563,7 @@ featureModuleTable <- function(sce,
563 563
   } else {
564 564
       dn <- lapply(allGenes$index,
565 565
           FUN = function(v) {
566
-              rowData(sce)[[displayName]][v]
566
+            SummarizedExperiment::rowData(sce)[[displayName]][v]
567 567
           })
568 568
       res <- vapply(dn,
569 569
           FUN = "[",
... ...
@@ -76,7 +76,7 @@
76 76
 #' @rdname reportceldaCG
77 77
 #' @examples
78 78
 #' data(sceCeldaCG)
79
-#' \donttest{
79
+#' \dontrun{
80 80
 #' library(SingleCellExperiment)
81 81
 #' sceCeldaCG$sum <- colSums(counts(sceCeldaCG))
82 82
 #' rowData(sceCeldaCG)$rownames <- rownames(sceCeldaCG)
... ...
@@ -124,7 +124,7 @@ Run Celda with different combinations of parameters and
124 124
  but not be displayed in \code{stdout}.
125 125
 }
126 126
 \examples{
127
-\donttest{
127
+\dontrun{
128 128
 data(celdaCGSim)
129 129
 ## Run various combinations of parameters with 'celdaGridSearch'
130 130
 celdaCGGridSearchRes <- celdaGridSearch(celdaCGSim$counts,
... ...
@@ -151,7 +151,7 @@ Default \code{TRUE}.}
151 151
 }
152 152
 \examples{
153 153
 data(sceCeldaCG)
154
-\donttest{
154
+\dontrun{
155 155
 library(SingleCellExperiment)
156 156
 sceCeldaCG$sum <- colSums(counts(sceCeldaCG))
157 157
 rowData(sceCeldaCG)$rownames <- rownames(sceCeldaCG)