plotExGraph {pathRender}R Documentation

plot a gene network, coloring nodes according to relative expression values

Description

plot a gene network, coloring nodes according to relative expression values

Usage

plotExGraph(g, es, sampind=1, pal=colorRampPalette(brewer.pal(9, "Blues"))(length(nodes(g))), attgen=pwayRendAttrs)

Arguments

g graph representing a gene network
es an ExpressionSet instance
sampind sample to be used to obtain relative expression values
pal palette for coloring the nodes
attgen attribute generating function

Details

plots a colored network on the current graphics display

Value

as returned by Rgraphviz plot method for graphNEL instances

Author(s)

Vince Carey <stvjc@channing.harvard.edu>

Examples

library(graph)
data(pancrCaIni)
library(ALL)
data(ALL)
library(hgu95av2.db)
collap1 = reduceES( ALL, nodes(pancrCaIni), revmap(hgu95av2SYMBOL), "symbol", mean )
library(RColorBrewer)
plotExGraph( pancrCaIni, collap1, 1 )

[Package pathRender version 1.10.0 Index]