Entering edit mode
                    Jack Luo
        
    
        ▴
    
    450
        @jack-luo-4241
        Last seen 11.2 years ago
        
    Hi,
I am new to the probe match package altcdfenvs, when I was trying the
code
from the link:
http://127.0.0.1:21417/library/altcdfenvs/html/matchAffyProbes.html
library(hgu133aprobe)
filename <- system.file("exampleData", "sample.fasta",
                        package="altcdfenvs")
fasta.seq <- readFASTA(filename)
targets <- unlist(lapply(fasta.seq, "[[", "seq"))
names(targets) <- lapply(fasta.seq, "[[", "desc")
names(targets) <- sub("^>.+\\|(NM[^ \\|]+|Hs[^ \\|]+)\\| ? .+$", "",
                      names(targets))
m <- matchAffyProbes(hgu133aprobe,
                     targets,
                     "HG-U133A")
The error msg is
Error in validObject(.Object) :
  invalid class "AffyProbesMatch" object: labels should be unique.
Any idea what's the problem?
Thanks,
-Jack
        [[alternative HTML version deleted]]
                    
                
                