[BioC] Anyone have a GO slim list for Affy HG-U133A or HG-U133Av2?
    Aedin 
    Aedin.Culhane at ucd.ie
       
    Fri Feb 25 15:10:22 CET 2005
    
    
  
Dear Ken
I was recently doing the same kind of this. I needed to get counts of
genes in go slim classes on an old Affy hu6800 chip and compare this to
the distribution of genes in the genome.
To get GO slim counts I did the following
 
library(annaffy)
library(hu6800)
# I got a listing of the GO Slim classes from the Integr8 website at
EBI.
# http://www.ebi.ac.uk/integr8/GOAnalysisPage.do?orgProteomeID=25 and
saved this and a comma
# separated file
genome.go<-read.csv( "GO_count_ebi_integr8.csv")
add.counts<-function(xx.list, ref){
  n = length(ref)
  out=vector()
  for (i in 1:n) {
     go= as.character(ref[i])
     if(length(xx.list) > 0){
       go.count= length(xx.list[go][[1]])
       out[i] = go.count
        }
    }
   return(out)
  }
res.go$hu68002allprobe = add.counts(as.list(hu6800GO2ALLPROBES),
genome.go[,1])
res.go$hu68002probe = add.counts(as.list(hu6800GO2PROBE), genome.go[,1])
Otherwise, you may wish to browse the equivalent to 
as.list(hu6800GO2ALLPROBES)
as.list(hu6800GO2PROBE)
The library(hgu133a_2)  will have an equivalent hgu133a_2GO2ALLPROBES
etc
Hope this helps
Aedin
    
    
More information about the Bioconductor
mailing list