Skip to content.

bioconductor.org

Bioconductor is an open source and open development software project
for the analysis and comprehension of genomic data.

Sections

Lab2b.R

################################################### ### chunk number 1: setup ################################################### library(annotate) library(geneplotter) library(hgu95av2) newChrom <- buildChromLocation("hgu95av2") newChrom

################################################### ### chunk number 2: cPlot ################################################### cPlot(newChrom) data(eset) cColor(geneNames(eset), "red", newChrom)

################################################### ### chunk number 3: just2 ################################################### cPlot(newChrom,c("1","2"),fg="yellow",scale="relative") cColor(geneNames(eset), "red", newChrom)

################################################### ### chunk number 4: cPlot2 ###################################################

par(mfrow=c(2,1)) for (sc in c("max","relative")) cPlot(newChrom,fg="blue",scale=sc)

################################################### ### chunk number 5: alongChrom ###################################################

cols <- c("red", "green", "blue") cols <- cols[eset$cov3]

par(mfrow=c(3,2)) alongChrom(eset, "1", newChrom, xloc="equispaced", plotFormat="cumulative", col=cols,lwd=2) alongChrom(eset, "1", newChrom, xloc="physical", col=cols,lwd=2) alongChrom(eset, "1", newChrom, xloc="equispaced", plotFormat="local", col=cols,lwd=2) alongChrom(eset, "1", newChrom, xloc="equispaced", plotFormat="local", col=cols, type="p", pch=16) alongChrom(eset, "1", newChrom, xlim = c(87511280,127717880), xloc="equispaced", plotFormat="local", col=cols, type="p", pch=16) alongChrom(eset, "1", newChrom, xloc="equispaced", plotFormat="image")

################################################### ### chunk number 6: heatmap ################################################### data(eset) Exprs <- exprs(eset) gN <- geneNames(eset) syms <- getSYMBOL(gN, "hgu95av2") syms <- ifelse(is.na(syms),gN, syms) row.names(Exprs) <- syms

heatmap(Exprs[1:100,], col=rev(dChip.colors(50)))

################################################### ### chunk number 7: hm2 ################################################### slf <- function(d) hclust(d, method="single") heatmap(Exprs[1:50,], col=rev(dChip.colors(50)), hclustfun=slf)

################################################### ### chunk number 8: dist1 ###################################################

##Euclidean distances d1 <- dist(t(scale(Exprs))) dN <- dimnames(Exprs)[[2]] nS <- length(dN) d1M <- as.matrix(d1) dimnames(d1M) <- list(dN, dN) par(mfrow=c(1,1)) image(1:nS,1:nS,d1M, col=dChip.colors(50), axes=FALSE, xlab="", ylab="", main="Between Sample Distances") axis(1, at =(1:nS), label=dN, tick=FALSE ) axis(2, at =(1:nS), label=dN, tick=FALSE )

################################################### ### chunk number 9: ellipse1 ################################################### library(ellipse) r <- cor(Exprs) d2M <- 1-r plotcorr(r, main="Correlation Matrix for eset data")

################################################### ### chunk number 10: hmdist ################################################### heatmap(d1M, col=dChip.colors(50), scale="none")

################################################### ### chunk number 11: hmdist2 ################################################### heatmap(r, col=dChip.colors(50), scale="none")

News
2009-10-26

BioC 2.5, consisting of 352 packages and designed to work with R 2.10.z, was released today.

2009-01-07

R, the open source platform used by Bioconductor, featured in a series of articles in the New York Times.