Integating phenodata with PorGene 1.0 ST array
1
1
Entering edit mode
aminbau14 • 0
@aminbau14-7116
Last seen 9.2 years ago
Germany

Hello Dear BioC,

I am working with affymetrix PorGene 1.0 ST arrays and are trying to read in my CEL files with the oligo package. I  am in trouble integrating the phenodata to the expression data. the code i am trying...

 The pData.txt is the file with my phenodata.

> pheno <- read.AnnotatedDataFrame("pData.txt", header = TRUE, row.name="Filename",sep="\t")
Error in data[[rowvar]] : attempt to select less than one element
> OligoRaw<-read.celfiles(filenames=list.celfiles(), phenoData=pheno, verbose = TRUE)
Platform design info loaded.
Error in data[[rowvar]] : attempt to select less than one element
> OligoRaw<-read.celfiles(filenames=list.celfiles(), phenoData=pheno, verbose = TRUE)
Platform design info loaded.
Reading in : 0h_rep1_(PorGene-1_0-st).CEL
Reading in : 0h_rep1_(PorGene-1_0-st).CEL
Reading in : 0h_rep2_(PorGene-1_0-st).CEL
Reading in : 0h_rep2_(PorGene-1_0-st).CEL
Reading in : 0h_rep3_(PorGene-1_0-st).CEL
Reading in : 0h_rep3_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep1_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep1_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep2_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep3_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep2_(PorGene-1_0-st).CEL
Reading in : 24hp_vacci_rep3_(PorGene-1_0-st).CEL
Error in validObject(out) : invalid class “GeneFeatureSet” object:
  NChannelSet levels(varMetadata(object)$channel) / assayDataElementNames() mismatch; see
    ?"channelNames<-,NChannelSet,character-method"
> x <- varMetadata(pheno)
Error in validObject(out) : invalid class “GeneFeatureSet” object:
  NChannelSet levels(varMetadata(object)$channel) / assayDataElementNames() mismatch; see
    ?"channelNames<-,NChannelSet,character-method"
> x <- varMetadata(pheno)
> x <- data.frame(x, channel = "_ALL_")
> varMetadata(pheno) <- x
> eset <- rma(oligoRaw)
Error in probeNames(object, subset) :
  error in evaluating the argument 'object' in selecting a method for function 'probeNames': Error: object 'oligoRaw' not found
> x <- data.frame(x, channel = "_ALL_")
> varMetadata(pheno) <- x
> eset <- rma(oligoRaw)
Error in probeNames(object, subset) :
  error in evaluating the argument 'object' in selecting a method for function 'probeNames': Error: object 'oligoRaw' not found

Please advice me..how could proceed?

Greetings and cheers!

Amin

 

oligo annotation • 1.4k views
ADD COMMENT
0
Entering edit mode
@james-w-macdonald-5106
Last seen 38 minutes ago
United States

There is likely something wrong with the phenoData that you are trying to load. It's fairly tricky to create a correct phenoData object, so try without it first.

oligoRaw <- read.celfiles(list.celfiles())

eset <- rma(oligoRaw)

 

ADD COMMENT
0
Entering edit mode

Thanks,

But i got error message like

> eset <- rma(oligoRaw)
Error in (function (classes, fdef, mtable)  : 
  unable to find an inherited method for function ‘probeNames’ for signature ‘"GeneFeatureSet"’

Any more way to go, please!

Regards

amin

 

ADD REPLY
0
Entering edit mode

You have most likely also loaded the affy package, after loading oligo. As an example:

> oligoRaw <- read.celfiles(list.celfiles())
Loading required package: pd.ragene.2.0.st
Loading required package: RSQLite
Loading required package: DBI
Platform design info loaded.

<snip>

> eset <- rma(oligoRaw)
Background correcting
Normalizing
Calculating Expression

> library(affy)

> eset2 <- rma(oligoRaw)
Error in (function (classes, fdef, mtable)  :
  unable to find an inherited method for function ‘probeNames’ for signature ‘"GeneFeatureSet"’

The best idea is to not load the affy package. The second best idea is to use the oligo version of rma directly:

> eset2 <- oligo::rma(oligoRaw)
Background correcting
Normalizing
Calculating Expression

 

ADD REPLY

Login before adding your answer.

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