Skip to content.

bioconductor.org

Bioconductor is an open source and open development software project
for the analysis and comprehension of genomic data.

Sections

R code for the Graph Lab

This will be the actual code we use in the Lab.

##############################

#####################

### chunk number 1: load

###################################################

library('graph')

library('Rgraphviz')

library('RBGL')

library('GO')

library('GOstats')

library('ALL')

library('hgu95av2')

library('genefilter')





###################################################

### chunk number 2: 2

###################################################

myNodes <- c('s', 'p', 'q', 'r')

myEdges <- list(s=list(edges=c('p', 'q')),

               p=list(edges=c('p', 'q')),

               q=list(edges=c('p', 'r')),

               r=list(edges=c('s')))

g <- new('graphNEL', nodes=myNodes, edgeL=myEdges, edgemode='directed')

g

plot(g)





###################################################

### chunk number 3: 3

###################################################

nodes(g)

edges(g)

degree(g)

plot(g)





###################################################

### chunk number 4: grManip

###################################################

g1 = addNode("t", g)

g2 = removeNode("p", g)

g3 = addEdge("t", "s", g1, weights=pi/2)

plot(g3)





###################################################

### chunk number 5: imca

###################################################

data("integrinMediatedCellAdhesion")

IMCAGraph

nodes(IMCAGraph)

edges(IMCAGraph)





###################################################

### chunk number 6: exploreimca

###################################################

class(IMCAGraph)

adj(IMCAGraph, "SOS")

s = acc(IMCAGraph, "SOS")

s





###################################################

### chunk number 7: setop

###################################################

V <- letters[1:4]

set.seed(4713)

ug1 <- randomGraph(V, 1, .55)

ug2 <- randomGraph(V, 1, .55)

plot(ug1)

plot(ug2)

plot(complement(ug1))

plot(intersection(ug1,ug2))

plot(union(ug1,ug2))





###################################################

### chunk number 8: graphrep

###################################################

ft = cbind(1:4, c(2,3,1,4))

ft

m = ftM2adjM(ft)

g = ftM2graphNEL(ft)

plot(g)





###################################################

### chunk number 9: gxl eval=FALSE

###################################################

## edit(file=system.file("GXL", "kmstEx.gxl", package="graph"))





###################################################

### chunk number 10: rg

###################################################

re  = randomEGraph(paste(1:100), edges=50)

plot(re, "neato")





###################################################

### chunk number 11: cc

###################################################

cc = connComp(re)

cc[1:5]

table(listLen(cc))

wh = which.max(listLen(cc))

sg = subGraph(cc[[wh]], re)

plot(sg, "neato")





###################################################

### chunk number 12: igg

###################################################

get("GO:0003700", GOTERM)

tfg = GOGraph("GO:0003700", GOMFPARENTS)





###################################################

### chunk number 13:

###################################################

plot(tfg)

get("GO:0003677", GOTERM)





###################################################

### chunk number 14: nda

###################################################

nda = makeNodeAttrs(re)

nda





###################################################

### chunk number 15: colors

###################################################

colors = rainbow(length(cc))

ord    = order(listLen(cc))

for(i in seq(along=ord))

 nda$fillcolor[cc[[ord[i]]]] = colors[i]





###################################################

### chunk number 16: la

###################################################

la = agopen(re,  nodeAttrs=nda, layoutType="neato", name="whatever")

la

plot(la)





###################################################

### chunk number 17: la2

###################################################

nda$shape[cc[[4]]]="box"

la2 = agopen(re,  nodeAttrs=nda, layoutType="neato", name="whatever")

plot(la2)





###################################################

### chunk number 18:

###################################################

class(la)

slotNames(la)

AgEdge(la)

slotNames(AgEdge(la)[[1]])

AgEdge(la)[[1]]@color





###################################################

### chunk number 19: all

###################################################

data(ALL)

s1 = grep("^B", as.character(ALL$BT))

s2 = which(as.character(ALL$mol) %in% c("BCR/ABL","NEG"))

eset = ALL[, intersect(s1, s2)]





###################################################

### chunk number 20: iqr

###################################################

n = nrow(pData(eset))

q25 = rowQ(exprs(eset), n*0.25)

q75 = rowQ(exprs(eset), n*0.75)

iqr = q75-q25

sel = (iqr>=median(iqr))

eset = eset[sel, ]





###################################################

### chunk number 21: tt

###################################################

tt = rowttests(eset, "mol")

hist(tt$p.value, 200, col="orange")

diffps =  geneNames(eset)[order(tt$p.value)[1:100]]

diffps





###################################################

### chunk number 22:

###################################################

diffll = unlist(mget(diffps, hgu95av2LOCUSID))

diffll

diffll = as.character(unique(diffll))





###################################################

### chunk number 23: hyperg

###################################################

gGhyp = GOHyperG(diffll)

hist(gGhyp$pv)

goCats = names(which(gGhyp$pv<0.01))

 mget(goCats, GOTERM)





###################################################

### chunk number 24: indGoG

###################################################

gGO = makeGOGraph(diffll, "MF")

gGO

natt = makeNodeAttrs(gGO, shape="ellipse", label=substr(nodes(gGO), 7, 10))

natt$fillcolor[goCats]='red'

lgGO = agopen(gGO, recipEdges="distinct", layoutType="dot", nodeAttrs=natt, name="")

plot(lgGO)
News
2009-10-26

BioC 2.5, consisting of 352 packages and designed to work with R 2.10.z, was released today.

2009-01-07

R, the open source platform used by Bioconductor, featured in a series of articles in the New York Times.