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)
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().