findSigInterval {OmicsLonDA} | R Documentation |
Find Significant Interval based on testStat
findSigInterval(adjusted.pvalue, threshold = 0.05, sign)
adjusted.pvalue |
vector of the adjusted p-value |
threshold |
p-value cut off |
sign |
vector hold area sign of each time interval |
returns a list of the start and end points of all significant time intervals
Ahmed Metwally (ametwall@stanford.edu)
library(SummarizedExperiment) padjusted = abs(rnorm(10, mean = 0.05, sd = 0.04)) sign = sample(x = c(1,-1), 10, replace = TRUE) intervals = findSigInterval(adjusted.pvalue = padjusted, threshold = 0.05, sign = sign)