### R code from vignette source 'ssviz.Rnw'

###################################################
### code chunk number 1: ssviz.Rnw:36-38 (eval = FALSE)
###################################################
## source("http://www.bioconductor.org/biocLite.R")
## biocLite("ssviz")


###################################################
### code chunk number 2: loadingPackage
###################################################
library(ssviz)


###################################################
### code chunk number 3: loaddata
###################################################
data(ssviz)


###################################################
### code chunk number 4: loading-bam
###################################################
bam.files<-dir(system.file("extdata", package="ssviz"), full=TRUE, patt="bam$")
ctrlbam<-readBam(bam.files[1])
treatbam<-readBam(bam.files[2])


###################################################
### code chunk number 5: viewobject
###################################################
ctrlbam


###################################################
### code chunk number 6: gettingReadCounts
###################################################
ctrl.count<-getCountMatrix(ctrlbam)
treat.count<-getCountMatrix(treatbam)


###################################################
### code chunk number 7: gettingReadCounts2
###################################################
ctrl.count[1,]


###################################################
### code chunk number 8: plotdistro1 (eval = FALSE)
###################################################
## plotDistro(list(ctrl.count), type="qwidth", samplenames=c("Control"), ncounts=counts[1])


###################################################
### code chunk number 9: plotdistro2 (eval = FALSE)
###################################################
## plotDistro(list(ctrl.count, treat.count), type="qwidth", samplenames=c("Control","Treatment"), ncounts=counts)


###################################################
### code chunk number 10: regiondens (eval = FALSE)
###################################################
## region<-'chr1:3015526-3080526'
## plotRegion(list(ctrl.count), region=region)


###################################################
### code chunk number 11: pingpong (eval = FALSE)
###################################################
## pp.ctrl<-pingpong(pctrlbam.count)
## plotPP(list(pp.ctrl), samplenames=c("Control"))


###################################################
### code chunk number 12: ntfreq (eval = FALSE)
###################################################
## pctrlbam.count<-getCountMatrix(pctrlbam)
## freq.ctrl<-ntfreq(pctrlbam.count, ntlength=10)
## plotFreq(freq.ctrl)


###################################################
### code chunk number 13: ssviz.Rnw:166-167
###################################################
sessionInfo()