git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/bsseq@78749 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -98,7 +98,7 @@ getStats <- function(BSseqTstat, regions = NULL, column = "tstat.corrected") { |
98 | 98 |
} |
99 | 99 |
stats_ttest<- matrix(NA, ncol = 4, nrow = length(regions)) |
100 | 100 |
colnames(stats_ttest) <- c("meanDiff", "group1.mean", "group2.mean", "tstat.sd") |
101 |
- tmp <- lapply(ov.sp, getRegionStats) |
|
101 |
+ tmp <- lapply(ov.sp, getRegionStats_ttest) |
|
102 | 102 |
stats_ttest[as.integer(names(tmp)),] <- do.call(rbind, tmp) |
103 | 103 |
out <- cbind(out, as.data.frame(stats_ttest)) |
104 | 104 |
out |