postHocTest {microbiomeMarker} | R Documentation |
This function is used for create postHocTest
object, and is only used for
developers.
postHocTest( result, abundance, conf_level = 0.95, method = "tukey", method_str = paste("Posthoc multiple comparisons of means: ", method) )
result |
a |
abundance |
data.frame. |
conf_level |
numeric, confidence level. |
method |
character, method for posthoc test. |
method_str |
character, illustrates which method is used for posthoc test. |
a postHocTest
object.
require(IRanges) pht <- postHocTest( result = DataFrameList( featureA = DataFrame( comparisons = c("group2-group1", "group3-group1", "group3-group2"), diff_mean = runif(3), pvalue = rep(0.01, 3), ci_lower = rep(0.01, 3), ci_upper = rep(0.011, 3) ), featureB = DataFrame( comparisons = c("group2-group1", "group3-group1", "group3-group2"), diff_mean = runif(3), pvalue = rep(0.01, 3), ci_lower = rep(0.01, 3), ci_upper = rep(0.011, 3) ) ), abundance = data.frame( featureA = runif(3), featureB = runif(3), group = c("group1", "group2", "grou3") ) ) pht