Browse code

fix examples

yingxinlin authored on 16/04/2020 08:18:32
Showing 5 changed files

... ...
@@ -1,7 +1,7 @@
1 1
 Package: CiteFuse
2 2
 Type: Package
3 3
 Title: CiteFuse: multi-modal analysis of CITE-seq data
4
-Version: 0.99.7
4
+Version: 0.99.8
5 5
 Authors@R: c(
6 6
     person("Yingxin", "Lin", email = "[email protected]", role = c("aut", "cre")
7 7
     ),
... ...
@@ -343,7 +343,7 @@ doWilcox <- function(exprsMat,
343 343
         keep <- meanPct[, 2] > exprs_pct
344 344
 
345 345
         test_res <- apply(exprsMat[keep,], 1, function(x)
346
-            stats::wilcox.test(x ~ tmp_celltype))
346
+            suppressWarnings(stats::wilcox.test(x ~ tmp_celltype)))
347 347
 
348 348
         test_res <- lapply(test_res, function(x) {
349 349
             stats <- x$statistic
... ...
@@ -168,6 +168,7 @@ preprocessing <- function(exprsMat = NULL,
168 168
 #'
169 169
 #' @examples
170 170
 #'
171
+#' \dontrun{
171 172
 #' tmpdir <- tempdir()
172 173
 #' tenXdata <- "http://cf.10xgenomics.com/samples/cell-exp/3.1.0/connect_5k_pbmc_NGSC3_ch1/"
173 174
 #' file <- "connect_5k_pbmc_NGSC3_ch1_filtered_feature_bc_matrix.tar.gz"
... ...
@@ -177,7 +178,7 @@ preprocessing <- function(exprsMat = NULL,
177 178
 #' sce_citeseq_10X <- readFrom10X(file.path(tmpdir,
178 179
 #' "filtered_feature_bc_matrix/"))
179 180
 #' sce_citeseq_10X
180
-#'
181
+#'}
181 182
 #'
182 183
 #' @export
183 184
 #'
... ...
@@ -30,6 +30,7 @@ A function to read the data from 10X
30 30
 }
31 31
 \examples{
32 32
 
33
+\dontrun{
33 34
 tmpdir <- tempdir()
34 35
 tenXdata <- "http://cf.10xgenomics.com/samples/cell-exp/3.1.0/connect_5k_pbmc_NGSC3_ch1/"
35 36
 file <- "connect_5k_pbmc_NGSC3_ch1_filtered_feature_bc_matrix.tar.gz"
... ...
@@ -39,6 +40,6 @@ untar(file.path(tmpdir,file),
39 40
 sce_citeseq_10X <- readFrom10X(file.path(tmpdir,
40 41
 "filtered_feature_bc_matrix/"))
41 42
 sce_citeseq_10X
42
-
43
+}
43 44
 
44 45
 }
... ...
@@ -572,7 +572,7 @@ de_res_filter
572 572
 
573 573
 Readers unfamiliar with the workflow of converting a count matrix into a `SingleCellExperiment` object may use the `readFrom10X` function to convert count matrix from a 10X experiment into an object that can be used for all functions in CiteFuse. 
574 574
 
575
-```{r}
575
+```{r eval = FALSE}
576 576
 tmpdir <- tempdir()
577 577
 download.file("http://cf.10xgenomics.com/samples/cell-exp/3.1.0/connect_5k_pbmc_NGSC3_ch1/connect_5k_pbmc_NGSC3_ch1_filtered_feature_bc_matrix.tar.gz", file.path(tmpdir, "/5k_pbmc_NGSC3_ch1_filtered_feature_bc_matrix.tar.gz"))
578 578
 untar(file.path(tmpdir, "5k_pbmc_NGSC3_ch1_filtered_feature_bc_matrix.tar.gz"),