gcrma error? - linked to makeProbePackage ?
1
0
Entering edit mode
@benoit-ballester-2259
Last seen 9.6 years ago
Hi, I am trying to use gcrma for the mouse GNF/Novartis data. This dataset use a custom affy chip gnGNF1Musa. I got the CDF file and probe file from GEO. > library("gngnf1musacdf") > library("gngnf1musaprobe") > eset.gcrma<-gcrma(Data) Adjusting for optical effect.......[more dots].....Done. Computing affinitiesError: length(prlen) == 1 is not TRUE I create the CDF package like this: > library(makecdfenv) > make.cdf.package("gnGNF1Musa.cdf", species = "Mus_musculus") then $> R CMD INSTALL gngnf1musacdf When I create the probe package, I have a warning. I don't know if it's linked to the gcrma error have. > filename<-system.file("extdata","gnGNF1Musa.probe.tab") > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > species<-"Mus_musculus" > outdir<-tempdir() > makeProbePackage("gnGNF1Musa", datafile = filename, outdir = outdir, maintainer = me, species = species, version = "0.0.1",force = TRUE) Importing the data. Creating package in /tmp/RtmpIaiUst/gngnf1musaprobe Writing the data. Checking the package. Building the package. [1] "gngnf1musaprobe" Warning message: file("") only supports open = "w+" and open = "w+b": using the former > then $> R CMD INSTALL gngnf1musaprobe I use R Version 2.3.1 (2006-06-01) > sessionInfo() Version 2.3.1 (2006-06-01) x86_64-unknown-linux-gnu attached base packages: [1] "tools" "methods" "stats" "graphics" "grDevices" "utils" [7] "datasets" "base" other attached packages: gcrma matchprobes makecdfenv affy affyio Biobase "2.4.1" "1.4.0" "1.10.0" "1.10.0" "1.0.0" "1.10.0" Do you think that the error I get from gcrma is linked to the cdf/probe package I have made. I also noticed that the probe file I have, has one extra column called "Serial Order". Do you think it might explain the gcrma error ? Probe Set Name Serial Order Probe X Probe Y Probe Interrogation Position Probe Sequence Target Strandedness AFFX-18SRNAMur/X00686_3_at 1 256 597 1333 GGTGGTGGTGCATGGCCGTTCTTAG Antisense AFFX-18SRNAMur/X00686_3_at 2 71 547 1341 TGCATGGCCGTTCTTAGTTGGTGGA Antisense Thanks, Ben -- Benoit Ballester, PhD
cdf probe affy makecdfenv gcrma matchprobes cdf probe affy makecdfenv gcrma matchprobes • 1.7k views
ADD COMMENT
0
Entering edit mode
@james-w-macdonald-5106
Last seen 5 hours ago
United States
Hi Ben, Benoit Ballester wrote: > Hi, > > I am trying to use gcrma for the mouse GNF/Novartis data. > This dataset use a custom affy chip gnGNF1Musa. I got the CDF file and > probe file from GEO. > > > > library("gngnf1musacdf") > > library("gngnf1musaprobe") > > eset.gcrma<-gcrma(Data) > Adjusting for optical effect.......[more dots].....Done. > Computing affinitiesError: length(prlen) == 1 is not TRUE This indicates that you have probes of more than one length (e.g., they are not all 25-mers). This might have to do with what you note below, that there is an extra column in your probe_tab file. However, there is error checking in makeProbePackage that is supposed to catch these sorts of things, so I am wondering how you were ever able to make the package in the first place. What do you get from head(as.data.frame(gngnf1musaprobe)) Does the probe sequence column actually contain probe sequences? If not, you will need to remove the extra column from your probe_tab file and re-run makeProbePackage. Best, Jim > > > I create the CDF package like this: > > library(makecdfenv) > > make.cdf.package("gnGNF1Musa.cdf", species = "Mus_musculus") > then $> R CMD INSTALL gngnf1musacdf > > > > When I create the probe package, I have a warning. I don't know if it's > linked to the gcrma error have. > > > filename<-system.file("extdata","gnGNF1Musa.probe.tab") > > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > > species<-"Mus_musculus" > > outdir<-tempdir() > > makeProbePackage("gnGNF1Musa", datafile = filename, outdir = outdir, > maintainer = me, species = species, version = "0.0.1",force = TRUE) > Importing the data. > Creating package in /tmp/RtmpIaiUst/gngnf1musaprobe > Writing the data. > Checking the package. > Building the package. > [1] "gngnf1musaprobe" > Warning message: > file("") only supports open = "w+" and open = "w+b": using the former > > > then $> R CMD INSTALL gngnf1musaprobe > > > > I use R Version 2.3.1 (2006-06-01) > > sessionInfo() > Version 2.3.1 (2006-06-01) > x86_64-unknown-linux-gnu > > attached base packages: > [1] "tools" "methods" "stats" "graphics" "grDevices" "utils" > [7] "datasets" "base" > > other attached packages: > gcrma matchprobes makecdfenv affy affyio Biobase > "2.4.1" "1.4.0" "1.10.0" "1.10.0" "1.0.0" "1.10.0" > > > > > Do you think that the error I get from gcrma is linked to the cdf/probe > package I have made. I also noticed that the probe file I have, has one > extra column called "Serial Order". Do you think it might explain the > gcrma error ? > > Probe Set Name Serial Order Probe X Probe Y Probe Interrogation > Position Probe Sequence Target Strandedness > AFFX-18SRNAMur/X00686_3_at 1 256 597 1333 > GGTGGTGGTGCATGGCCGTTCTTAG Antisense > AFFX-18SRNAMur/X00686_3_at 2 71 547 1341 > TGCATGGCCGTTCTTAGTTGGTGGA Antisense > > Thanks, > > Ben > > -- James W. MacDonald, M.S. Biostatistician Affymetrix and cDNA Microarray Core University of Michigan Cancer Center 1500 E. Medical Center Drive 7410 CCGC 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.
ADD COMMENT
0
Entering edit mode
James W. MacDonald wrote: > Hi Ben, > > Benoit Ballester wrote: >> Hi, >> >> I am trying to use gcrma for the mouse GNF/Novartis data. >> This dataset use a custom affy chip gnGNF1Musa. I got the CDF file and >> probe file from GEO. >> >> >> > library("gngnf1musacdf") >> > library("gngnf1musaprobe") >> > eset.gcrma<-gcrma(Data) >> Adjusting for optical effect.......[more dots].....Done. >> Computing affinitiesError: length(prlen) == 1 is not TRUE > > This indicates that you have probes of more than one length (e.g., they > are not all 25-mers). This might have to do with what you note below, > that there is an extra column in your probe_tab file. However, there is > error checking in makeProbePackage that is supposed to catch these sorts > of things, so I am wondering how you were ever able to make the package > in the first place. This is what I get when I install gngnf1musaprobe > R CMD INSTALL gngnf1musaprobe * Installing *source* package 'gngnf1musaprobe' ... ** R ** data ** help >>> Building/Updating help pages for package 'gngnf1musaprobe' Formats: text html latex example gngnf1musaprobe text html latex example ** building package indices ... * DONE (gngnf1musaprobe) looks fine to me > What do you get from > > head(as.data.frame(gngnf1musaprobe)) This is what I get : > library(gngnf1musaprobe) > head(as.data.frame(gngnf1musaprobe)) [1] sequence x [3] y Probe.Set.Name [5] Probe.Interrogation.Position Target.Strandedness <0 rows> (or 0-length row.names) > > gngnf1musaprobe Object of class probetable data.frame with 0 rows and 6 columns > > gngnf1musaprobe[1,1] [1] NA This doesn't look right ?!? > Does the probe sequence column actually contain probe sequences? If not, > you will need to remove the extra column from your probe_tab file and > re-run makeProbePackage. > > Best, > > Jim > > > > >> >> >> I create the CDF package like this: >> > library(makecdfenv) >> > make.cdf.package("gnGNF1Musa.cdf", species = "Mus_musculus") >> then $> R CMD INSTALL gngnf1musacdf >> >> >> >> When I create the probe package, I have a warning. I don't know if >> it's linked to the gcrma error have. >> >> > filename<-system.file("extdata","gnGNF1Musa.probe.tab") >> > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >> > species<-"Mus_musculus" >> > outdir<-tempdir() >> > makeProbePackage("gnGNF1Musa", datafile = filename, outdir = >> outdir, maintainer = me, species = species, version = "0.0.1",force = >> TRUE) >> Importing the data. >> Creating package in /tmp/RtmpIaiUst/gngnf1musaprobe >> Writing the data. >> Checking the package. >> Building the package. >> [1] "gngnf1musaprobe" >> Warning message: >> file("") only supports open = "w+" and open = "w+b": using the former >> > >> then $> R CMD INSTALL gngnf1musaprobe >> >> >> >> I use R Version 2.3.1 (2006-06-01) >> > sessionInfo() >> Version 2.3.1 (2006-06-01) >> x86_64-unknown-linux-gnu >> >> attached base packages: >> [1] "tools" "methods" "stats" "graphics" "grDevices" "utils" >> [7] "datasets" "base" >> >> other attached packages: >> gcrma matchprobes makecdfenv affy affyio Biobase >> "2.4.1" "1.4.0" "1.10.0" "1.10.0" "1.0.0" "1.10.0" >> >> >> >> >> Do you think that the error I get from gcrma is linked to the >> cdf/probe package I have made. I also noticed that the probe file I >> have, has one extra column called "Serial Order". Do you think it >> might explain the gcrma error ? >> >> Probe Set Name Serial Order Probe X Probe Y Probe Interrogation >> Position Probe Sequence Target Strandedness >> AFFX-18SRNAMur/X00686_3_at 1 256 597 1333 >> GGTGGTGGTGCATGGCCGTTCTTAG Antisense >> AFFX-18SRNAMur/X00686_3_at 2 71 547 1341 >> TGCATGGCCGTTCTTAGTTGGTGGA Antisense >> >> Thanks, >> >> Ben >> >> > > -- Benoit Ballester, PhD Ensembl Team European Bioinformatics Institute (EMBL-EBI) Wellcome Trust Genome Campus, Hinxton Cambridge CB10 1SD, United Kingdom
ADD REPLY
0
Entering edit mode
On Jul 5, 2007, at 8:48 AM, Benoit Ballester wrote: > > > James W. MacDonald wrote: >> Hi Ben, >> >> Benoit Ballester wrote: >>> Hi, >>> >>> I am trying to use gcrma for the mouse GNF/Novartis data. >>> This dataset use a custom affy chip gnGNF1Musa. I got the CDF >>> file and >>> probe file from GEO. >>> >>> >>>> library("gngnf1musacdf") >>>> library("gngnf1musaprobe") >>>> eset.gcrma<-gcrma(Data) >>> Adjusting for optical effect.......[more dots].....Done. >>> Computing affinitiesError: length(prlen) == 1 is not TRUE >> >> This indicates that you have probes of more than one length (e.g., >> they >> are not all 25-mers). This might have to do with what you note below, >> that there is an extra column in your probe_tab file. However, >> there is >> error checking in makeProbePackage that is supposed to catch these >> sorts >> of things, so I am wondering how you were ever able to make the >> package >> in the first place. > > This is what I get when I install gngnf1musaprobe >> R CMD INSTALL gngnf1musaprobe > * Installing *source* package 'gngnf1musaprobe' ... > ** R > ** data > ** help >>>> Building/Updating help pages for package 'gngnf1musaprobe' > Formats: text html latex example > gngnf1musaprobe text html latex example > ** building package indices ... > * DONE (gngnf1musaprobe) > > looks fine to me > >> What do you get from >> >> head(as.data.frame(gngnf1musaprobe)) > > This is what I get : > >> library(gngnf1musaprobe) >> head(as.data.frame(gngnf1musaprobe)) > [1] sequence x > [3] y Probe.Set.Name > [5] Probe.Interrogation.Position Target.Strandedness > <0 rows> (or 0-length row.names) >> >> gngnf1musaprobe > Object of class probetable data.frame with 0 rows and 6 columns >> >> gngnf1musaprobe[1,1] > [1] NA > > This doesn't look right ?!? No, this show that your probe package does not contain any probes (0 rows), meaning something major went wrong when it was created. As James I am mystified that the package got created anyway, but it is certain that you cannot use it as is. Kasper >> Does the probe sequence column actually contain probe sequences? >> If not, >> you will need to remove the extra column from your probe_tab file and >> re-run makeProbePackage. > > > > >> >> Best, >> >> Jim >> >> >> >> >>> >>> >>> I create the CDF package like this: >>>> library(makecdfenv) >>>> make.cdf.package("gnGNF1Musa.cdf", species = "Mus_musculus") >>> then $> R CMD INSTALL gngnf1musacdf >>> >>> >>> >>> When I create the probe package, I have a warning. I don't know if >>> it's linked to the gcrma error have. >>> >>>> filename<-system.file("extdata","gnGNF1Musa.probe.tab") >>>> me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >>>> species<-"Mus_musculus" >>>> outdir<-tempdir() >>>> makeProbePackage("gnGNF1Musa", datafile = filename, outdir = >>> outdir, maintainer = me, species = species, version = >>> "0.0.1",force = >>> TRUE) >>> Importing the data. >>> Creating package in /tmp/RtmpIaiUst/gngnf1musaprobe >>> Writing the data. >>> Checking the package. >>> Building the package. >>> [1] "gngnf1musaprobe" >>> Warning message: >>> file("") only supports open = "w+" and open = "w+b": using the >>> former >>>> >>> then $> R CMD INSTALL gngnf1musaprobe >>> >>> >>> >>> I use R Version 2.3.1 (2006-06-01) >>>> sessionInfo() >>> Version 2.3.1 (2006-06-01) >>> x86_64-unknown-linux-gnu >>> >>> attached base packages: >>> [1] "tools" "methods" "stats" "graphics" "grDevices" >>> "utils" >>> [7] "datasets" "base" >>> >>> other attached packages: >>> gcrma matchprobes makecdfenv affy affyio >>> Biobase >>> "2.4.1" "1.4.0" "1.10.0" "1.10.0" "1.0.0" >>> "1.10.0" >>> >>> >>> >>> >>> Do you think that the error I get from gcrma is linked to the >>> cdf/probe package I have made. I also noticed that the probe file I >>> have, has one extra column called "Serial Order". Do you think it >>> might explain the gcrma error ? >>> >>> Probe Set Name Serial Order Probe X Probe Y Probe Interrogation >>> Position Probe Sequence Target Strandedness >>> AFFX-18SRNAMur/X00686_3_at 1 256 597 1333 >>> GGTGGTGGTGCATGGCCGTTCTTAG Antisense >>> AFFX-18SRNAMur/X00686_3_at 2 71 547 1341 >>> TGCATGGCCGTTCTTAGTTGGTGGA Antisense >>> >>> Thanks, >>> >>> Ben >>> >>> >> >> > > -- > Benoit Ballester, PhD > Ensembl Team > European Bioinformatics Institute (EMBL-EBI) > Wellcome Trust Genome Campus, Hinxton > Cambridge CB10 1SD, United Kingdom > > _______________________________________________ > Bioconductor mailing list > Bioconductor at stat.math.ethz.ch > https://stat.ethz.ch/mailman/listinfo/bioconductor > Search the archives: http://news.gmane.org/ > gmane.science.biology.informatics.conductor
ADD REPLY
0
Entering edit mode
James W. MacDonald wrote: > Hi Ben, > > Benoit Ballester wrote: >> Hi, >> >> I am trying to use gcrma for the mouse GNF/Novartis data. >> This dataset use a custom affy chip gnGNF1Musa. I got the CDF file and >> probe file from GEO. >> >> >> > library("gngnf1musacdf") >> > library("gngnf1musaprobe") >> > eset.gcrma<-gcrma(Data) >> Adjusting for optical effect.......[more dots].....Done. >> Computing affinitiesError: length(prlen) == 1 is not TRUE > > This indicates that you have probes of more than one length (e.g., they > are not all 25-mers). This might have to do with what you note below, > that there is an extra column in your probe_tab file. However, there is > error checking in makeProbePackage that is supposed to catch these sorts > of things, so I am wondering how you were ever able to make the package > in the first place. > > What do you get from > > head(as.data.frame(gngnf1musaprobe)) > > Does the probe sequence column actually contain probe sequences? If not, > you will need to remove the extra column from your probe_tab file and > re-run makeProbePackage. Hi, This is what I have done - I have *removed* the extra column to have a tab file which looks like that : AFFX-BioB-5_at 429 502 123 TCGTCAGGTGCAGGTCAGCACGTTG Antisense AFFX-BioB-5_at 430 502 132 GCAGGTCAGCACGTTGCTGTCGATT Antisense AFFX-BioB-5_at 431 502 138 CAGCACGTTGCTGTCGATTAAGACC Antisense AFFX-BioB-5_at 432 502 147 GCTGTCGATTAAGACCGGAGCTTGT Antisense AFFX-BioB-5_at 433 502 165 AGCTTGTCCGGAAGATTGCAAATAC Antisense AFFX-BioB-5_at 434 502 177 AGATTGCAAATACTGCCCGCAAACG Antisense AFFX-BioB-5_at 435 502 183 CAAATACTGCCCGCAAACGTCGCGC Antisense AFFX-BioB-5_at 436 502 246 TGAACAGGTGCTGGAGTCGGCGCGC Antisense exactly like in the HG-U95Av2_probe_tab file that is in matrchprobes/extdata/ I rerun the makeProbePackage again > library(matchprobes) > filename<-system.file("extdata","gnGNF1Musa.probe.6tab") > > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > species<-"Mus_musculus" > > makeProbePackage("gnGNF1Musa", datafile = filename, maintainer = me, species = species, version = "0.0.1",force = TRUE) Importing the data. Creating package in ./gngnf1musaprobe Existing ./gngnf1musaprobe was removed. Writing the data. Checking the package. Building the package. [1] "gngnf1musaprobe" Warning message: file("") only supports open = "w+" and open = "w+b": using the former Then I reinstall gngnf1musaprobe: benoit at xxxx > R CMD INSTALL gngnf1musaprobe * Installing *source* package 'gngnf1musaprobe' ... ** R ** data ** help >>> Building/Updating help pages for package 'gngnf1musaprobe' Formats: text html latex example gngnf1musaprobe text html latex example ** building package indices ... * DONE (gngnf1musaprobe) If I look at : > library(gngnf1musaprobe) > head(as.data.frame(gngnf1musaprobe)) [1] sequence x [3] y Probe.Set.Name [5] Probe.Interrogation.Position Target.Strandedness <0 rows> (or 0-length row.names) > gngnf1musaprobe Object of class probetable data.frame with 0 rows and 6 columns > gngnf1musaprobe[1,1] [1] NA So I still get nothing. Am I doing something silly when I create gngnf1musaprobe or there something wrong in the code ? I have tried with the HG-U95Av2_probe_tab file from matchprobes/extdata, and recreated the probe env > library(matchprobes) > filename<-system.file("extdata"," HG-U95Av2_probe_tab") > > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > species<-"Homo_sapiens" > makeProbePackage("HG-U95Av2", datafile = filename, maintainer = me, species = species, version = "0.0.1",force = TRUE) Importing the data. Creating package in ./hgu95av2probe Writing the data. Checking the package. Building the package. [1] "hgu95av2probe" Warning message: file("") only supports open = "w+" and open = "w+b": using the former then : R CMD INSTALL hgu95av2probe back in R > library(hgu95av2probe) > hgu95av2probe Object of class probetable data.frame with 0 rows and 6 columns. > hgu95av2probe[1,1] [1] NA Wtill nothing with the examples. Looks like my file is not the problem, and the problem is somewhere else. Any ideas ? Cheers, Ben -- Benoit Ballester, PhD
ADD REPLY
0
Entering edit mode
Might I suggest, as a temporal solution, that you use the packages that I've previously built and posted on the bioC mailing list? http://article.gmane.org/gmane.science.biology.informatics.conductor/1 3659 Cheers, Cei Benoit Ballester wrote: > James W. MacDonald wrote: > >> Hi Ben, >> >> Benoit Ballester wrote: >> >>> Hi, >>> >>> I am trying to use gcrma for the mouse GNF/Novartis data. >>> This dataset use a custom affy chip gnGNF1Musa. I got the CDF file and >>> probe file from GEO. >>> >>> >>> > library("gngnf1musacdf") >>> > library("gngnf1musaprobe") >>> > eset.gcrma<-gcrma(Data) >>> Adjusting for optical effect.......[more dots].....Done. >>> Computing affinitiesError: length(prlen) == 1 is not TRUE >>> >> This indicates that you have probes of more than one length (e.g., they >> are not all 25-mers). This might have to do with what you note below, >> that there is an extra column in your probe_tab file. However, there is >> error checking in makeProbePackage that is supposed to catch these sorts >> of things, so I am wondering how you were ever able to make the package >> in the first place. >> >> What do you get from >> >> head(as.data.frame(gngnf1musaprobe)) >> >> Does the probe sequence column actually contain probe sequences? If not, >> you will need to remove the extra column from your probe_tab file and >> re-run makeProbePackage. >> > > Hi, > > This is what I have done - I have *removed* the extra column to have a > tab file which looks like that : > > AFFX-BioB-5_at 429 502 123 TCGTCAGGTGCAGGTCAGCACGTTG Antisense > AFFX-BioB-5_at 430 502 132 GCAGGTCAGCACGTTGCTGTCGATT Antisense > AFFX-BioB-5_at 431 502 138 CAGCACGTTGCTGTCGATTAAGACC Antisense > AFFX-BioB-5_at 432 502 147 GCTGTCGATTAAGACCGGAGCTTGT Antisense > AFFX-BioB-5_at 433 502 165 AGCTTGTCCGGAAGATTGCAAATAC Antisense > AFFX-BioB-5_at 434 502 177 AGATTGCAAATACTGCCCGCAAACG Antisense > AFFX-BioB-5_at 435 502 183 CAAATACTGCCCGCAAACGTCGCGC Antisense > AFFX-BioB-5_at 436 502 246 TGAACAGGTGCTGGAGTCGGCGCGC Antisense > > exactly like in the HG-U95Av2_probe_tab file that is in > matrchprobes/extdata/ > > > > I rerun the makeProbePackage again > > library(matchprobes) > > filename<-system.file("extdata","gnGNF1Musa.probe.6tab") > > > > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > > species<-"Mus_musculus" > > > > makeProbePackage("gnGNF1Musa", datafile = filename, maintainer = me, > species = species, version = "0.0.1",force = TRUE) > Importing the data. > Creating package in ./gngnf1musaprobe > Existing ./gngnf1musaprobe was removed. > Writing the data. > Checking the package. > Building the package. > [1] "gngnf1musaprobe" > Warning message: > file("") only supports open = "w+" and open = "w+b": using the former > > > > Then I reinstall gngnf1musaprobe: > > benoit at xxxx > R CMD INSTALL gngnf1musaprobe > * Installing *source* package 'gngnf1musaprobe' ... > ** R > ** data > ** help > >>> Building/Updating help pages for package 'gngnf1musaprobe' > Formats: text html latex example > gngnf1musaprobe text html latex example > ** building package indices ... > * DONE (gngnf1musaprobe) > > > > If I look at : > > > library(gngnf1musaprobe) > > head(as.data.frame(gngnf1musaprobe)) > [1] sequence x > [3] y Probe.Set.Name > [5] Probe.Interrogation.Position Target.Strandedness > <0 rows> (or 0-length row.names) > > > gngnf1musaprobe > Object of class probetable data.frame with 0 rows and 6 columns > > gngnf1musaprobe[1,1] > [1] NA > > > So I still get nothing. > Am I doing something silly when I create gngnf1musaprobe or there > something wrong in the code ? > > > I have tried with the HG-U95Av2_probe_tab file from matchprobes/extdata, > and recreated the probe env > > > library(matchprobes) > > filename<-system.file("extdata"," HG-U95Av2_probe_tab") > > > > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" > > species<-"Homo_sapiens" > > makeProbePackage("HG-U95Av2", datafile = filename, maintainer = me, > species = species, version = "0.0.1",force = TRUE) > Importing the data. > Creating package in ./hgu95av2probe > Writing the data. > Checking the package. > Building the package. > [1] "hgu95av2probe" > Warning message: > file("") only supports open = "w+" and open = "w+b": using the former > > > then : > R CMD INSTALL hgu95av2probe > > back in R > > library(hgu95av2probe) > > hgu95av2probe > Object of class probetable data.frame with 0 rows and 6 columns. > > hgu95av2probe[1,1] > [1] NA > > > Wtill nothing with the examples. Looks like my file is not the problem, > and the problem is somewhere else. > Any ideas ? > > > Cheers, > > Ben > > -- The Wellcome Trust Sanger Institute is operated by Genome Research Limited, a charity registered in England with number 1021457 and a company registered in England with number 2742969, whose registered office is 215 Euston Road, London, NW1 2BE.
ADD REPLY
0
Entering edit mode
Hi, already tested - and doesn't seem to work - it seems that there is a version issue. > library(gngnf1musaprobe) Error: package 'matchprobes' 1.4.0 was found, but >= 1.8.1 is required by 'gngnf1musaprobe' Would that explain why it doesn't work ? Also I realized that I don't specify package="matchprobes" when I load my file. filename<-system.file("extdata","gnGNF1Musa.probe.6tab") doing so : filename<-system.file("extdata","gnGNF1Musa.probe.6tab", package="matchprobes") and re-creating gngnf1musaprobe, gives me the same error than with cei probe package. would that be the reason why something goes wrong ? Cheers, Ben Cei Abreu-Goodger wrote: > Might I suggest, as a temporal solution, that you use the packages that > I've previously built and posted on the bioC mailing list? > > http://article.gmane.org/gmane.science.biology.informatics.conductor /13659 > > Cheers, > > Cei > > Benoit Ballester wrote: >> James W. MacDonald wrote: >> >>> Hi Ben, >>> >>> Benoit Ballester wrote: >>> >>>> Hi, >>>> >>>> I am trying to use gcrma for the mouse GNF/Novartis data. >>>> This dataset use a custom affy chip gnGNF1Musa. I got the CDF file >>>> and probe file from GEO. >>>> >>>> >>>> > library("gngnf1musacdf") >>>> > library("gngnf1musaprobe") >>>> > eset.gcrma<-gcrma(Data) >>>> Adjusting for optical effect.......[more dots].....Done. >>>> Computing affinitiesError: length(prlen) == 1 is not TRUE >>>> >>> This indicates that you have probes of more than one length (e.g., >>> they are not all 25-mers). This might have to do with what you note >>> below, that there is an extra column in your probe_tab file. However, >>> there is error checking in makeProbePackage that is supposed to catch >>> these sorts of things, so I am wondering how you were ever able to >>> make the package in the first place. >>> >>> What do you get from >>> >>> head(as.data.frame(gngnf1musaprobe)) >>> >>> Does the probe sequence column actually contain probe sequences? If >>> not, you will need to remove the extra column from your probe_tab >>> file and re-run makeProbePackage. >>> >> >> Hi, >> >> This is what I have done - I have *removed* the extra column to have a >> tab file which looks like that : >> >> AFFX-BioB-5_at 429 502 123 TCGTCAGGTGCAGGTCAGCACGTTG Antisense >> AFFX-BioB-5_at 430 502 132 GCAGGTCAGCACGTTGCTGTCGATT Antisense >> AFFX-BioB-5_at 431 502 138 CAGCACGTTGCTGTCGATTAAGACC Antisense >> AFFX-BioB-5_at 432 502 147 GCTGTCGATTAAGACCGGAGCTTGT Antisense >> AFFX-BioB-5_at 433 502 165 AGCTTGTCCGGAAGATTGCAAATAC Antisense >> AFFX-BioB-5_at 434 502 177 AGATTGCAAATACTGCCCGCAAACG Antisense >> AFFX-BioB-5_at 435 502 183 CAAATACTGCCCGCAAACGTCGCGC Antisense >> AFFX-BioB-5_at 436 502 246 TGAACAGGTGCTGGAGTCGGCGCGC Antisense >> >> exactly like in the HG-U95Av2_probe_tab file that is in >> matrchprobes/extdata/ >> >> >> >> I rerun the makeProbePackage again >> > library(matchprobes) >> > filename<-system.file("extdata","gnGNF1Musa.probe.6tab") >> > >> > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >> > species<-"Mus_musculus" >> > >> > makeProbePackage("gnGNF1Musa", datafile = filename, maintainer = >> me, species = species, version = "0.0.1",force = TRUE) >> Importing the data. >> Creating package in ./gngnf1musaprobe >> Existing ./gngnf1musaprobe was removed. >> Writing the data. >> Checking the package. >> Building the package. >> [1] "gngnf1musaprobe" >> Warning message: >> file("") only supports open = "w+" and open = "w+b": using the former >> >> >> >> Then I reinstall gngnf1musaprobe: >> >> benoit at xxxx > R CMD INSTALL gngnf1musaprobe >> * Installing *source* package 'gngnf1musaprobe' ... >> ** R >> ** data >> ** help >> >>> Building/Updating help pages for package 'gngnf1musaprobe' >> Formats: text html latex example >> gngnf1musaprobe text html latex example >> ** building package indices ... >> * DONE (gngnf1musaprobe) >> >> >> >> If I look at : >> >> > library(gngnf1musaprobe) >> > head(as.data.frame(gngnf1musaprobe)) >> [1] sequence x >> [3] y Probe.Set.Name >> [5] Probe.Interrogation.Position Target.Strandedness >> <0 rows> (or 0-length row.names) >> >> > gngnf1musaprobe >> Object of class probetable data.frame with 0 rows and 6 columns >> > gngnf1musaprobe[1,1] >> [1] NA >> >> >> So I still get nothing. >> Am I doing something silly when I create gngnf1musaprobe or there >> something wrong in the code ? >> >> >> I have tried with the HG-U95Av2_probe_tab file from >> matchprobes/extdata, and recreated the probe env >> >> > library(matchprobes) >> > filename<-system.file("extdata"," HG-U95Av2_probe_tab") >> > >> > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >> > species<-"Homo_sapiens" >> > makeProbePackage("HG-U95Av2", datafile = filename, maintainer = >> me, species = species, version = "0.0.1",force = TRUE) >> Importing the data. >> Creating package in ./hgu95av2probe >> Writing the data. >> Checking the package. >> Building the package. >> [1] "hgu95av2probe" >> Warning message: >> file("") only supports open = "w+" and open = "w+b": using the former >> >> >> then : >> R CMD INSTALL hgu95av2probe >> >> back in R >> > library(hgu95av2probe) >> > hgu95av2probe >> Object of class probetable data.frame with 0 rows and 6 columns. >> > hgu95av2probe[1,1] >> [1] NA >> >> >> Wtill nothing with the examples. Looks like my file is not the >> problem, and the problem is somewhere else. >> Any ideas ? >> >> >> Cheers, >> >> Ben >> >> > > > -- Benoit Ballester, PhD Ensembl Team European Bioinformatics Institute (EMBL-EBI) Wellcome Trust Genome Campus, Hinxton Cambridge CB10 1SD, United Kingdom
ADD REPLY
0
Entering edit mode
Is there some reason for you not wanting to update your BioC distribution? It might even solve the problem you had with the matchprobes package... Cei Benoit Ballester wrote: > Hi, > > already tested - and doesn't seem to work - it seems that there is a > version issue. > > > library(gngnf1musaprobe) > Error: package 'matchprobes' 1.4.0 was found, but >= 1.8.1 is required > by 'gngnf1musaprobe' > > Would that explain why it doesn't work ? > Also I realized that I don't specify package="matchprobes" when I > load my file. > > filename<-system.file("extdata","gnGNF1Musa.probe.6tab") > > > doing so : > filename<-system.file("extdata","gnGNF1Musa.probe.6tab", > package="matchprobes") > and re-creating gngnf1musaprobe, gives me the same error than with cei > probe package. > > would that be the reason why something goes wrong ? > > Cheers, > > Ben > > Cei Abreu-Goodger wrote: >> Might I suggest, as a temporal solution, that you use the packages >> that I've previously built and posted on the bioC mailing list? >> >> http://article.gmane.org/gmane.science.biology.informatics.conducto r/13659 >> >> >> Cheers, >> >> Cei >> >> Benoit Ballester wrote: >>> James W. MacDonald wrote: >>> >>>> Hi Ben, >>>> >>>> Benoit Ballester wrote: >>>> >>>>> Hi, >>>>> >>>>> I am trying to use gcrma for the mouse GNF/Novartis data. >>>>> This dataset use a custom affy chip gnGNF1Musa. I got the CDF file >>>>> and probe file from GEO. >>>>> >>>>> >>>>> > library("gngnf1musacdf") >>>>> > library("gngnf1musaprobe") >>>>> > eset.gcrma<-gcrma(Data) >>>>> Adjusting for optical effect.......[more dots].....Done. >>>>> Computing affinitiesError: length(prlen) == 1 is not TRUE >>>>> >>>> This indicates that you have probes of more than one length (e.g., >>>> they are not all 25-mers). This might have to do with what you note >>>> below, that there is an extra column in your probe_tab file. >>>> However, there is error checking in makeProbePackage that is >>>> supposed to catch these sorts of things, so I am wondering how you >>>> were ever able to make the package in the first place. >>>> >>>> What do you get from >>>> >>>> head(as.data.frame(gngnf1musaprobe)) >>>> >>>> Does the probe sequence column actually contain probe sequences? If >>>> not, you will need to remove the extra column from your probe_tab >>>> file and re-run makeProbePackage. >>>> >>> >>> Hi, >>> >>> This is what I have done - I have *removed* the extra column to have >>> a tab file which looks like that : >>> >>> AFFX-BioB-5_at 429 502 123 TCGTCAGGTGCAGGTCAGCACGTTG Antisense >>> AFFX-BioB-5_at 430 502 132 GCAGGTCAGCACGTTGCTGTCGATT Antisense >>> AFFX-BioB-5_at 431 502 138 CAGCACGTTGCTGTCGATTAAGACC Antisense >>> AFFX-BioB-5_at 432 502 147 GCTGTCGATTAAGACCGGAGCTTGT Antisense >>> AFFX-BioB-5_at 433 502 165 AGCTTGTCCGGAAGATTGCAAATAC Antisense >>> AFFX-BioB-5_at 434 502 177 AGATTGCAAATACTGCCCGCAAACG Antisense >>> AFFX-BioB-5_at 435 502 183 CAAATACTGCCCGCAAACGTCGCGC Antisense >>> AFFX-BioB-5_at 436 502 246 TGAACAGGTGCTGGAGTCGGCGCGC Antisense >>> >>> exactly like in the HG-U95Av2_probe_tab file that is in >>> matrchprobes/extdata/ >>> >>> >>> >>> I rerun the makeProbePackage again >>> > library(matchprobes) >>> > filename<-system.file("extdata","gnGNF1Musa.probe.6tab") >>> > >>> > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >>> > species<-"Mus_musculus" >>> > >>> > makeProbePackage("gnGNF1Musa", datafile = filename, maintainer = >>> me, species = species, version = "0.0.1",force = TRUE) >>> Importing the data. >>> Creating package in ./gngnf1musaprobe >>> Existing ./gngnf1musaprobe was removed. >>> Writing the data. >>> Checking the package. >>> Building the package. >>> [1] "gngnf1musaprobe" >>> Warning message: >>> file("") only supports open = "w+" and open = "w+b": using the former >>> >>> >>> >>> Then I reinstall gngnf1musaprobe: >>> >>> benoit at xxxx > R CMD INSTALL gngnf1musaprobe >>> * Installing *source* package 'gngnf1musaprobe' ... >>> ** R >>> ** data >>> ** help >>> >>> Building/Updating help pages for package 'gngnf1musaprobe' >>> Formats: text html latex example >>> gngnf1musaprobe text html latex example >>> ** building package indices ... >>> * DONE (gngnf1musaprobe) >>> >>> >>> >>> If I look at : >>> >>> > library(gngnf1musaprobe) >>> > head(as.data.frame(gngnf1musaprobe)) >>> [1] sequence x >>> [3] y Probe.Set.Name >>> [5] Probe.Interrogation.Position Target.Strandedness >>> <0 rows> (or 0-length row.names) >>> >>> > gngnf1musaprobe >>> Object of class probetable data.frame with 0 rows and 6 columns >>> > gngnf1musaprobe[1,1] >>> [1] NA >>> >>> >>> So I still get nothing. >>> Am I doing something silly when I create gngnf1musaprobe or there >>> something wrong in the code ? >>> >>> >>> I have tried with the HG-U95Av2_probe_tab file from >>> matchprobes/extdata, and recreated the probe env >>> >>> > library(matchprobes) >>> > filename<-system.file("extdata"," HG-U95Av2_probe_tab") >>> > >>> > me<-"Benoit Ballester<benoit at="" ebi.ac.uk="">" >>> > species<-"Homo_sapiens" >>> > makeProbePackage("HG-U95Av2", datafile = filename, maintainer = >>> me, species = species, version = "0.0.1",force = TRUE) >>> Importing the data. >>> Creating package in ./hgu95av2probe >>> Writing the data. >>> Checking the package. >>> Building the package. >>> [1] "hgu95av2probe" >>> Warning message: >>> file("") only supports open = "w+" and open = "w+b": using the former >>> >>> >>> then : >>> R CMD INSTALL hgu95av2probe >>> >>> back in R >>> > library(hgu95av2probe) >>> > hgu95av2probe >>> Object of class probetable data.frame with 0 rows and 6 columns. >>> > hgu95av2probe[1,1] >>> [1] NA >>> >>> >>> Wtill nothing with the examples. Looks like my file is not the >>> problem, and the problem is somewhere else. >>> Any ideas ? >>> >>> >>> Cheers, >>> >>> Ben >>> >>> >> >> >> > -- The Wellcome Trust Sanger Institute is operated by Genome Research Limited, a charity registered in England with number 1021457 and a company registered in England with number 2742969, whose registered office is 215 Euston Road, London, NW1 2BE.
ADD REPLY
0
Entering edit mode
Cei Abreu-Goodger wrote: > Is there some reason for you not wanting to update your BioC > distribution? It might even solve the problem you had with the > matchprobes package... As far as I understand the BioC distrib is linked to the R version installed. In my case I am using R (2.3.1) in a shared server, so having bioc1.8 > source("http://bioconductor.org/biocLite.R") > biocLite(c("matchprobes")) Running biocinstall version 1.8.5 with R version 2.3.1 Your version of R requires version 1.8 of Bioconductor. Warning in install.packages(pkgs = pkgs, repos = repos, dependencies = dependencies, : argument 'lib' is missing: using /ebi/research/biomart/benoit/R/R_LIB trying URL 'http://bioconductor.org/packages/1.8/bioc/src/contrib/matchprobes_1.4 .0.tar.gz' Content type 'application/x-gzip' length 7654424 bytes opened URL ================================================== downloaded 7475Kb * Installing *source* package 'matchprobes' ..
ADD REPLY
0
Entering edit mode
Hi Ben, Benoit Ballester wrote: > > Cei Abreu-Goodger wrote: >> Is there some reason for you not wanting to update your BioC >> distribution? It might even solve the problem you had with the >> matchprobes package... > > As far as I understand the BioC distrib is linked to the R version > installed. > In my case I am using R (2.3.1) in a shared server, so having bioc1.8 Even on a shared server you should have enough space in your home directory to compile a current version of R. This IMO is the preferred way to go so you don't have to rely on your sysadmin to update things regularly (which obviously isn't happening for you). Best, Jim > > > source("http://bioconductor.org/biocLite.R") > > biocLite(c("matchprobes")) > Running biocinstall version 1.8.5 with R version 2.3.1 > Your version of R requires version 1.8 of Bioconductor. > Warning in install.packages(pkgs = pkgs, repos = repos, dependencies = > dependencies, : > argument 'lib' is missing: using > /ebi/research/biomart/benoit/R/R_LIB > trying URL > 'http://bioconductor.org/packages/1.8/bioc/src/contrib/matchprobes_1 .4.0.tar.gz' > Content type 'application/x-gzip' length 7654424 bytes > opened URL > ================================================== > downloaded 7475Kb > > * Installing *source* package 'matchprobes' .. > > _______________________________________________ > Bioconductor mailing list > Bioconductor at stat.math.ethz.ch > https://stat.ethz.ch/mailman/listinfo/bioconductor > Search the archives: http://news.gmane.org/gmane.science.biology.informatics.conductor -- James W. MacDonald, M.S. Biostatistician Affymetrix and cDNA Microarray Core University of Michigan Cancer Center 1500 E. Medical Center Drive 7410 CCGC 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.
ADD REPLY

Login before adding your answer.

Traffic: 859 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6