krandtest {ade4}R Documentation

Class of the Permutation Tests (in C).

Description

Plot and print many permutation tests. Objects of class 'krandtest' are data frame with n+1 rows and p columns.
Each column corresponds to a permutation test : the first value is the observed-value and the n others are the simulated ones.

Usage

plot.krandtest(x, mfrow = NULL, nclass = NULL, main.title = names(x), ...)
print.krandtest(x, ...)

Arguments

x : an object of class 'krandtest'
mfrow : a vector of the form 'c(nr,nc)', otherwise computed by as special own function n2mfrow
nclass : a number of intervals for the histogram
main.title : a string of character for the main title
... : further arguments passed to or from other methods

Value

plot.krandtest draws the p simulated values histograms and the position of the observed value.

Author(s)

Daniel Chessel chessel@biomserv.univ-lyon1.fr

See Also

randtest

Examples

wkrandtest <- data.frame(eg1=c(0, rnorm(200)))
for (x0 in c(1.2,2.4,3.4,5.4,20.4)) {
    wkrandtest <- cbind.data.frame(wkrandtest, c(x0, rnorm(200)))
}
names(wkrandtest) <- paste ("Test",1:6,sep="_")
class(wkrandtest) <- "krandtest"
wkrandtest
plot(wkrandtest)

[Package ade4 version 1.4-0 Index]