Skip to content.

bioconductor.org

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

Sections

Lab2a.R

################################################### ### chunk number 1: bio-lib ################################################### library(annotate) library(hu6800) ls(pos=2)

affynames <- ls(env=hu6800CHR) length(affynames)

hu6800()

################################################### ### chunk number 2: bio-look ###################################################

mygene <- affynames[4001] get(mygene, env = hu6800ACCNUM) get(mygene, env = hu6800LOCUSID) get(mygene, env = hu6800SYMBOL) get(mygene, env = hu6800GENENAME) get(mygene, env = hu6800SUMFUNC) get(mygene, env = hu6800UNIGENE) get(mygene, env = hu6800CHR) get(mygene, env = hu6800CHRLOC) get(mygene, env = hu6800MAP) get(mygene, env = hu6800PMID) get(mygene, env = hu6800GO)

multiget(affynames[1:10], env = hu6800PMID)

################################################### ### chunk number 3: chromtable ###################################################

whChrom <- multiget(affynames, env=hu6800CHR)

table(unlist(whChrom))

vv<-sapply(whChrom, length) table(vv)

whChrom[vv==2]

################################################### ### chunk number 4: pubmed ###################################################

pmids<-get(mygene, env = hu6800PMID) if(interactive() ) pubmed(pmids, disp="browser")

# With pm.getabst absts2<-pm.getabst(mygene,"hu6800") pm.titles(absts2) sapply(absts2, function(x) pm.abstGrep("[Pp]rotein", x))

################################################### ### chunk number 5: genbank ################################################### g10<-affynames[1:10] gbacc<-multiget(g10,hu6800ACCNUM) if( interactive() ) genbank(gbacc,disp="browser") gb<-genbank(gbacc[1],disp="data")

################################################### ### chunk number 6: locuslink ################################################### llid<-multiget(affynames[1:10],hu6800LOCUSID) map<-multiget(affynames[1:10],hu6800MAP) symb<-multiget(affynames[1:10],hu6800SYMBOL)

res<-data.frame(affynames[1:10],cbind(unlist(symb),unlist(map))) names(res)<-c("Affy ID","Gene symbol", "Chromosomal location") ll.htmlpage(llid, filename="LocusLink.html", title="HTML report", othernames=res, table.head=c("LocusID",names(res)), table.center = TRUE, repository="ll")

################################################### ### chunk number 7: apoptosisGO ################################################### library(GO) bpcGO <- contents(GOBPID2TERM) go.bpc <- bpcGO[grep("^[Aa]poptosis", unlist(bpcGO))] go.bpc

################################################### ### chunk number 8: getapopGO ###################################################

affyApop <- get(names(go.bpc), env=hu6800GO2PROBE) length(affyApop) affyAllApop <- get(names(go.bpc), env=hu6800GO2ALLPROBES) length(affyAllApop)

################################################### ### chunk number 9: apoptosisKEGG ################################################### library(KEGG) apKEGG <- contents(KEGGPATHID2NAME) kegg.ap <- apKEGG[grep("^[Aa]poptosis", unlist(apKEGG))] kegg.ap

affykegg.ap <- get(names(kegg.ap), env=hu6800PATH2PROBE)

sum(affykegg.ap %in% affyApop)

sum(affykegg.ap %in% affyAllApop)

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.