aggregateExprs {PGSEA}R Documentation

Aggregate expression data

Description

This function removes duplicates row names from an expression set, summarizing them with a function of the users choice. The "absMax" function located in package "reb" we have found to be useful.

Usage

aggregateExprs(x, package = "hgu133plus2", using = "ENTREZID", FUN, ...)

Arguments

x expression data - matrix, eSet, or exprSet
package annotation package of expression data
using format type that gene IDs are converted to
FUN function by which to summarize duplicated values
... exra parameters passed on to FUN

Value

A matrix of expression data with the rows aggregated to a unique format chosen by the user. The new identifiers of the returned matrix are those specified with the "using" argument. To see possible values, use the ls() command illustrated below in the examples.

Author(s)

Kyle Furge <kyle.furge@vai.org> and Karl Dykema <karl.dykema@vai.org>

Examples


        if (require(hgu95av2) & require(annaffy)) {
    library(annaffy)
                data(aafExpr)
    class(exprs(aafExpr))
    exprs(aafExpr)[1:4, 1:4]

                        #list possible values for the "using" argument
                ls(pos=which(search()=="package:hgu95av2"))
                
                convert <- aggregateExprs(exprs(aafExpr),"hgu95av2",FUN=mean,na.rm=TRUE)
          convert[1:4,1:4]
        }


[Package PGSEA version 1.6.0 Index]