Eisen-formatted expression data
1
0
Entering edit mode
@steffen-moeller-514
Last seen 9.6 years ago
Below I paste a function that reads expression data from files formatted for Michael Eisen's Cluster tool. If somebody took this (code/idea) and incorporated it into the core of BioConductor, I would very much appreciate it. A write.eisen function might be very helpful, too. Is this of interest, should I go ahead? Where in BioConductor would this fit in? Kind regards Steffen # Reads microarray expression data formatted for # Michael Eisen's Cluster tool. # by Steffen Moeller <moeller@pzr.uni-rostock.de> read.eisen <- function(file,sep="\t",dec=".") { f<-read.table(file=file,header=TRUE,sep=sep,dec=dec) rownames(f)<-f[,1] if ("UNIQID"!=colnames(f)[1]) { stop(paste("This is not a proper Eisen-formatted file ('",file,"').",sep="")) } if ("NAME"==colnames(f)[2]) { colstart<-3 } else { colstart<-2 } if (""==rownames(f)[1]) { rowstart<-2 } else { rowstart<-1 } r<-f[rowstart:nrow(f),colstart:ncol(f)] if (2==rowstart) { attr(r,"second.row")<-f[1,colstart:ncol(f)] } else { attr(r,"second.row")<-NULL } if (3==colstart) { attr(r,"NAME")<-f[rowstart:nrow(f),2] } else { attr(r,"NAME")<-NULL } return(r) }
Microarray GO Microarray GO • 694 views
ADD COMMENT
0
Entering edit mode
@sean-davis-490
Last seen 3 months ago
United States
On Apr 12, 2005, at 6:10 AM, Steffen Moeller wrote: > Below I paste a function that reads expression data from files > formatted > for Michael Eisen's Cluster tool. If somebody took this (code/idea) and > incorporated it into the core of BioConductor, I would very much > appreciate it. A write.eisen function might be very helpful, too. Is > this of interest, should I go ahead? Where in BioConductor would this > fit in? Have you looked at the ctc package? Looks like it has at least some of that functionality. http://www.bioconductor.org/repository/devel/package/html/ctc.html Sean
ADD COMMENT

Login before adding your answer.

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