Error in normalize.AffyBatch.invariantset
2
0
Entering edit mode
@markus-schmidberger-2240
Last seen 9.6 years ago
Hello, I found a simple error in the "normalize.AffyBatch.invariantset" function. On line 72, there is a "nunlist". I think this should be a unlist! else if (type == "together") { pms <- nunlist(indexProbes(abatch, "both")) do.normalize.Affybatch.invariantset(abatch, pms, prd.td, baseline.type) } Best Markus -- Dipl.-Tech. Math. Markus Schmidberger Ludwig-Maximilians-Universit?t M?nchen IBE - Institut f?r medizinische Informationsverarbeitung, Biometrie und Epidemiologie Marchioninistr. 15, D-81377 Muenchen URL: http://ibe.web.med.uni-muenchen.de Mail: Markus.Schmidberger [at] ibe.med.uni-muenchen.de
• 769 views
ADD COMMENT
0
Entering edit mode
Seth Falcon ★ 7.4k
@seth-falcon-992
Last seen 9.6 years ago
Hi Markus, Markus Schmidberger <schmidb at="" ibe.med.uni-muenchen.de=""> writes: > Hello, > > I found a simple error in the "normalize.AffyBatch.invariantset" > function. On line 72, there is a "nunlist". I think this should be a unlist! > > else if (type == "together") { > pms <- nunlist(indexProbes(abatch, "both")) > do.normalize.Affybatch.invariantset(abatch, pms, prd.td, > baseline.type) > } Thanks for the report. This was fixed in the development version of the affy package on 10 May. The fix applied was: --- a/affy/R/normalize.invariantset.R +++ b/affy/R/normalize.invariantset.R @@ -78,7 +78,7 @@ normalize.AffyBatch.invariantset <- function(abatch, prd.td=c( pms <- unlist(mmindex(abatch)) do.normalize.Affybatch.invariantset(abatch, pms, prd.td, baseline.type) } else if (type == "together"){ - pms <- nunlist(indexProbes(abatch,"both")) + pms <- unlist(indexProbes(abatch,"both")) do.normalize.Affybatch.invariantset(abatch, pms, prd.td, baseline.type) } else if (type == "separate"){ pms <- unlist(pmindex(abatch)) I hope you will continue to send such reports to the list, but when you do, please remember to include package name, version number, R version, etc. Best, + seth -- Seth Falcon | Computational Biology | Fred Hutchinson Cancer Research Center BioC: http://bioconductor.org/ Blog: http://userprimary.net/user/
ADD COMMENT
0
Entering edit mode
Hi, here the missing information: > sessionInfo() R version 2.5.1 (2007-06-27) i386-pc-mingw32 locale: LC_COLLATE=German_Germany.1252;LC_CTYPE=German_Germany.1252;LC_MONETAR Y=German_Germany.1252;LC_NUMERIC=C;LC_TIME=German_Germany.1252 attached base packages: [1] "tools" "stats" "graphics" "grDevices" "utils" "datasets" [7] "methods" "base" other attached packages: affy affyio Biobase "1.14.2" "1.4.1" "1.14.1" Best, Markus Seth Falcon schrieb: > Hi Markus, > > Markus Schmidberger <schmidb at="" ibe.med.uni-muenchen.de=""> writes: > >> Hello, >> >> I found a simple error in the "normalize.AffyBatch.invariantset" >> function. On line 72, there is a "nunlist". I think this should be a unlist! >> >> else if (type == "together") { >> pms <- nunlist(indexProbes(abatch, "both")) >> do.normalize.Affybatch.invariantset(abatch, pms, prd.td, >> baseline.type) >> } >> > > Thanks for the report. This was fixed in the development version of > the affy package on 10 May. The fix applied was: > > --- a/affy/R/normalize.invariantset.R > +++ b/affy/R/normalize.invariantset.R > @@ -78,7 +78,7 @@ normalize.AffyBatch.invariantset <- function(abatch, prd.td=c( > pms <- unlist(mmindex(abatch)) > do.normalize.Affybatch.invariantset(abatch, pms, prd.td, baseline.type) > } else if (type == "together"){ > - pms <- nunlist(indexProbes(abatch,"both")) > + pms <- unlist(indexProbes(abatch,"both")) > do.normalize.Affybatch.invariantset(abatch, pms, prd.td, baseline.type) > } else if (type == "separate"){ > pms <- unlist(pmindex(abatch)) > > I hope you will continue to send such reports to the list, but when > you do, please remember to include package name, version number, R > version, etc. > > Best, > > + seth > > -- Dipl.-Tech. Math. Markus Schmidberger Ludwig-Maximilians-Universit?t M?nchen IBE - Institut f?r medizinische Informationsverarbeitung, Biometrie und Epidemiologie Marchioninistr. 15, D-81377 Muenchen URL: http://ibe.web.med.uni-muenchen.de Mail: Markus.Schmidberger [at] ibe.med.uni-muenchen.de Tel: +49 (089) 7095 - 4599
ADD REPLY
0
Entering edit mode
@james-w-macdonald-5106
Last seen 35 minutes ago
United States
Hi Markus, Thanks for the report, but Seth beat you to it: ---------------------------------------------------------------------- -- r24575 | sethf | 2007-05-10 10:36:40 -0400 (Thu, 10 May 2007) | 2 lines Changed paths: M /trunk/madman/Rpacks/affy/DESCRIPTION M /trunk/madman/Rpacks/affy/R/normalize.invariantset.R Fix typo in call to unlist (was nunlist). ---------------------------------------------------------------------- -- Best, Jim Markus Schmidberger wrote: > Hello, > > I found a simple error in the "normalize.AffyBatch.invariantset" > function. On line 72, there is a "nunlist". I think this should be a unlist! > > else if (type == "together") { > pms <- nunlist(indexProbes(abatch, "both")) > do.normalize.Affybatch.invariantset(abatch, pms, prd.td, > baseline.type) > } > > Best > Markus > -- 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
ADD COMMENT

Login before adding your answer.

Traffic: 827 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