[BioC] Problems with homology packages

James W. MacDonald jmacdon at med.umich.edu
Mon Jul 4 14:07:27 CEST 2005


Bosotti, Roberta [Nervianoms] wrote:
> Dear list,
> 
> I'm trying to obtain a list of mouse homologs of human genes present in
> Affymetrix chips (human hgu133plus2 and mouse 430) following the homology
> packages Vignette, but I didn't succeded. Here is the code and the error
> messages I got.
> I'm using R-2.1.1 and Bioconductor 1.6 package.
> Could you help me?
> Thanks, Roberta
> 
> 
>>library("mmuhomology")
>>subset(mmuhomologyORGCODE, species_name == "Homo sapiens")
> 
> Error in subset.matrix(mmuhomologyORGCODE, species_name == "Homo sapiens") :
> 
>         Object "species_name" not found

What version of the mmuhomology package are you using? This works for me.

 > subset(mmuhomologyORGCODE, species_name =="Homo sapiens")
    species_name tax_id tla
24 Homo sapiens   9606 hsa

> 
>>temp <- mget(mmuhomologyHGID, mmuhomologyDATA)
>>tempFun <- function(x) {
> 
>  for (i in x) {
>  if (!is.na(i[["homoOrg"]]) && i[["homoOrg"]] ==
>  "hsa" && i[["homoPS"]] > 90) {
>  return(i)
>  }
>  }
>  return(NA)
>  }
> 

I think you are missing something here. You also have to test for 
homoType == "B". If homoType == "c", then you will return an NA, which 
is why your tempFun is erroring out.

tempFun <- function(x) {

   for (i in x) {
     if (!is.na(i[["homoOrg"]]) && i[["homoOrg"]] ==
     "hsa" && i[["homoType"]] == "B" && i[["homoPS"]] > 90) {
     return(i)
     }
   }
   return(NA)
}


HTH,

Jim


>>goodGenes <- sapply(temp, tempFun)> goodGenes <- sapply(temp, tempFun)
> 
> Error in if (!is.na(i[["homoOrg"]]) && i[["homoOrg"]] == "hsa" &&
> i[["homoPS"]] >  : 
>         missing value where TRUE/FALSE needed
> 
> 
> 
> 
> ******************************************************************************
> DISCLAIMER AND CONFIDENTIAL NOTICE\ \ The information contai...{{dropped}}
> 
> _______________________________________________
> Bioconductor mailing list
> Bioconductor at stat.math.ethz.ch
> https://stat.ethz.ch/mailman/listinfo/bioconductor


-- 
James W. MacDonald
University of Michigan
Affymetrix and cDNA Microarray Core
1500 E Medical Center Drive
Ann Arbor MI 48109
734-647-5623



**********************************************************
Electronic Mail is not secure, may not be read every day, and should not be used for urgent or sensitive issues.



More information about the Bioconductor mailing list