Skip to content.

bioconductor.org

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

Sections

Lab12.R

################################################### ### chunk number 1: loadlibs ################################################### library(mda) library(dr) library(Milan)

################################################### ### chunk number 2: loaddata ################################################### data(brca) names(brca)=c("plate", "cid","BC11","BC15","BC13","BC17","BC12","BC14","BC210a","BC29","BC28","BC210b","SP16","SP17","SP15","SP18","SP19","SP21","SP20","BC16","BC213","BC214","BC211","BC212") brca <- (brca[,c(-1,-2)]) brca.class <- c(rep(1,6),rep(2,4),rep(0,7),1,rep(2,4))

################################################### ### chunk number 3: setup ################################################### brcam=matrix(brca) brda=as.vector(brca$BC11[[1]]) for (i in 2:22) brda=cbind(brda,brcam[[i]][[1]])

################################################### ### chunk number 4: svd ################################################### da1 <- svdrfda(factor(brca.class)~t(brda),K=3) plot.fda(da1) confusion(predict(da1),factor(brca.class))

################################################### ### chunk number 5: cpls ################################################### da2 <- svdpls1fda(factor(brca.class)~t(brda),K=3) plot.fda(da2) confusion(predict(da1),factor(brca.class))

################################################### ### chunk number 6: gpls ################################################### y <- c(rep(1,6),rep(0,11),1,rep(0,4)) fit<-gpls(y,t(brda), components = 4,family = "binomial", link = "logit") # plot(fit$glm.details) z=fit$mu>0.5 z=as.integer(z) confusion(z,y)

################################################### ### chunk number 7: sir ################################################### fitdr=dr(y~t(brda),method="Sir",nslices=2) plot(fitdr,mark.by.y=T)

################################################### ### chunk number 8: save ################################################### fitdr=dr(y~t(brda),method="Save",nslices=2) dr.permutation.test(fitdr,npermute=100) plot(fitdr,mark.by.y=T)

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.