RMA normalization, human versus citrus
4
1
Entering edit mode
Angel ▴ 40
@angel-7981
Last seen 7.0 years ago
Berlin

hi friends,

i need your help please...i tried to adopt a tutorial in human (GSE27447) to my case in citrus sinensis because i am not familiar enough with R...

 but in some case (with ????) i do not know what i should type instead of...my query is GSE67376 (citrus sinensis)

source(http://bioconductor.org/biocLite.R)

biocLite("GEOquery")
biocLite("affy")
biocLite("gcrma")
biocLite("hugene10stv1cdf")       biocLite("citruscdf")
biocLite("hugene10stv1probe")  biocLite("citrusprobe")
biocLite("hugene10stprobeset.db")  ????????????
biocLite("hugene10sttranscriptcluster.db") ???????

library(GEOquery)
library(affy)
library(gcrma)
library(hugene10stv1cdf)   library("citruscdf")
library(hugene10stv1probe) library("citrusprobe")
library(hugene10stprobeset.db) ?????????
library(hugene10sttranscriptcluster.db)  ?????

setwd("C:/Users/Man/Desktop/New folder (3)")
getGEOSuppFiles("GSE27447")
setwd("C:/Users/Man/Desktop/New folder (3)/GSE27447")
untar("GSE27447_RAW.tar", exdir="data")
cels = list.files("data/", pattern = "CEL")
sapply(paste("data", cels, sep="/"), gunzip)
cels = list.files("data/", pattern = "CEL")
setwd("C:/Users/Man/Desktop/New folder (3)/data")

raw.data=ReadAffy(verbose=TRUE, filenames=cels, cdfname="hugene10stv1")
raw.data=ReadAffy(verbose=TRUE, filenames=cels, cdfname="hugene10stv1") ("citruscdf")

data.rma.norm=rma(raw.data)
rma=exprs(data.rma.norm)
rma=format(rma, digits=5)

ls("package:hugene10stprobeset.db") #Annotations at the exon probeset level ???????
ls("package:hugene10sttranscriptcluster.db") ??????
#Extract probe ids, entrez symbols, and entrez ids
probes=row.names(rma)
Symbols = unlist(mget(probes, hugene10sttranscriptclusterSYMBOL, ifnotfound=NA)) ?????
Entrez_IDs = unlist(mget(probes, hugene10sttranscriptclusterENTREZID, ifnotfound=NA)) ???

#Combine gene annotations with raw data
rma=cbind(probes,Symbols,Entrez_IDs,rma)

#Write RMA-normalized, mapped data to file
write.table(rma, file = "rma.txt", quote = FALSE, sep = "\t", row.names = FALSE, col.names = TRUE)
RMA affy gcrma • 1.2k views
ADD COMMENT
3
Entering edit mode
@james-w-macdonald-5106
Last seen 13 hours ago
United States

There is no annotation package for this array, so you will have to use the file available from GEO, or get the annotation file from Affy. You don't have to tell the affy package what files it needs, this will suffice:

raw.data=ReadAffy(verbose=TRUE, filenames=cels)

and then you can summarize using

eset <- rma(raw.data)

then you can get annotation using GEOquery:

annot <- getGEO("GPL5731")

annot <- Table(annot)

You will probably have to look at the annotation data to see what you want to use, and then you can use merge() to make a data.frame that you can write out.

ADD COMMENT
0
Entering edit mode
Angel ▴ 40
@angel-7981
Last seen 7.0 years ago
Berlin

thank you very much

ADD COMMENT
0
Entering edit mode
Angel ▴ 40
@angel-7981
Last seen 7.0 years ago
Berlin

sorry James;

when i did these steps and used the rma.txt as input to aracne, it said that "no microarray name provided...

what does this error mean please?

ADD COMMENT
1
Entering edit mode

I don't know what you mean by 'used the rma.txt as input to aracne'. It is always helpful for you to give a brief idea of what you are trying to do, and to show your code (at least enough code that we can see what you are doing - a dump of 1000 lines of R code is no more helpful than 0 lines of code). Also include the output of sessionInfo().

ADD REPLY
0
Entering edit mode
Angel ▴ 40
@angel-7981
Last seen 7.0 years ago
Berlin

thanks a lot James for your attention,you are all right

i normalized an array experiment with RMA then the output was a rma.txt which i used as an input in ARACNe that i got error because i should select tab delimited format from menu because rma.txt was in this format....today i tried many hour to understand the reason of error.

anyway i am thankful

ADD COMMENT

Login before adding your answer.

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