Browse code

Fixes for last commit

Peter Hickey authored on 15/10/2018 05:46:15
Showing 2 changed files

1 1
Binary files a/data/BS.chr22.rda and b/data/BS.chr22.rda differ
... ...
@@ -45,7 +45,7 @@ read.lister <- function(file) {
45 45
         Cov = as.matrix(tmp$Cov, ncol = 1),
46 46
         sampleNames = "reverse")
47 47
     BS <- combine(BS.forward, BS.reverse)
48
-    BS <- collapseBSseq(BS, columns = c("a", "a"))
48
+    BS <- collapseBSseq(BS, group = c("a", "a"), type = "integer")
49 49
     BS
50 50
 }
51 51
 
... ...
@@ -59,12 +59,5 @@ pData(BS.chr22)$Rep <- c("replicate1", "replicate2")
59 59
 validObject(BS.chr22)
60 60
 pData(BS.chr22)
61 61
 
62
-# NOTE: To reduce size of object, set the storage.mode() of assays to integer.
63
-#       (at this point they use doubles because collapseBSseq() returns
64
-#       doubles).
65
-storage.mode(assay(BS.chr22, 1)) <- "integer"
66
-storage.mode(assay(BS.chr22, 2)) <- "integer"
67
-
68 62
 save(BS.chr22, file = "BS.chr22.rda")
69
-library(tools)
70
-resaveRdaFiles("BS.chr22.rda")
63
+tools::resaveRdaFiles("BS.chr22.rda")