###################################################
### chunk number 1: 
###################################################
#line 106 "vignettes/clusterStab/inst/doc/clusterStab.Rnw"
library(clusterStab)
library(genefilter)
library(fibroEset)
data(fibroEset)
exprs(fibroEset) <- log2(exprs(fibroEset))
filt <- cv(0.1, Inf)
index <- genefilter(fibroEset, filt)
fb <- fibroEset[index,]
bh <- benhur(fb, 0.7, 6, seednum = 12345) #seednum only used to ensure reproducibility


###################################################
### chunk number 2: 
###################################################
#line 130 "vignettes/clusterStab/inst/doc/clusterStab.Rnw"
hist(bh)


###################################################
### chunk number 3: 
###################################################
#line 146 "vignettes/clusterStab/inst/doc/clusterStab.Rnw"
plot(hclust(dist(t(exprs(fibroEset[index,])))), labels = pData(fibroEset)[,2], sub="", xlab="")


###################################################
### chunk number 4: 
###################################################
#line 163 "vignettes/clusterStab/inst/doc/clusterStab.Rnw"
ecdf(bh)


###################################################
### chunk number 5: 
###################################################
#line 176 "vignettes/clusterStab/inst/doc/clusterStab.Rnw"
cmp <- clusterComp(fb, 2)
cmp