Browse code

Small fix

Peter Hickey authored on 30/09/2018 02:02:35
Showing 1 changed files

... ...
@@ -85,7 +85,9 @@ computeStat <- function(BSseqStat, coef = NULL) {
85 85
     raw_tstats <- getStats(BSseqStat, what = "rawTstats")[, coef, drop = FALSE]
86 86
     scaled_sds <- getStats(BSseqStat, what = "rawSds") /
87 87
         getStats(BSseqStat, what = "smoothSds")
88
-    scaled_sds_matrix <- do.call(cbind, replicate(ncol(raw_tstats), scaled_sds))
88
+    scaled_sds_matrix <- matrix(
89
+        rep(scaled_sds, ncol(raw_tstats)),
90
+        ncol = ncol(raw_tstats))
89 91
     tstats <- raw_tstats * scaled_sds_matrix
90 92
     if(length(coef) > 1) {
91 93
         cor.coefficients <- getStats(BSseqStat,