## Chunk 1
![]() |
|||
library("BiocCaseStudies")
|
|||
## Chunk 2
![]() |
|||
library("ALL")
|
|||
## Chunk 3
![]() |
|||
table(ALL_af4bcr$mol.biol)
|
|||
## Chunk 4
![]() |
|||
qrange <- function(x)
|
|||
## Chunk 5
![]() |
|||
library("Biobase")
|
|||
## Chunk 6
![]() |
|||
rt = rowttests(ALLfilt_af4bcr, "mol.biol")
|
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
## Chunk 15
![]() |
|||
library("annaffy")
|
|||
## Chunk 16
![]() |
|||
browseURL(localURL)
|
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
![]() |
|||
## Chunk 27
![]() |
|||
library("GO.db")
|
|||
## Chunk 28
![]() |
|||
as.list(GOMFOFFSPRING["GO:0008094"])
|
|||
## Chunk 29
![]() |
|||
library("GOstats")
|
|||
## Chunk 30
![]() |
|||
affyUniverse = featureNames(ALLfilt_af4bcr)
|
|||
## Chunk 31
![]() |
|||
mfhyper = hyperGTest(params)
|
|||
## Chunk 32
![]() |
|||
hist(pvalues(mfhyper), breaks=50, col="mistyrose")
|
|||
![]() |
|||
![]() |
|||
## Chunk 35
![]() |
|||
## library("biomaRt")
|
|||
## Chunk 36
![]() |
|||
## mart = useMart("ensembl")
|
|||
## Chunk 37
![]() |
|||
## head(listDatasets(mart))
|
|||
## Chunk 38
![]() |
|||
## ensembl = useDataset("hsapiens_gene_ensembl",
|
|||
![]() |
|||
## Chunk 40
![]() |
|||
## head(listFilters(ensembl))
|
|||
## Chunk 41
![]() |
|||
## head(listAttributes(ensembl))
|
|||
![]() |
|||
## Chunk 43
![]() |
|||
library("hgu133a.db")
|
|||
## Chunk 44
![]() |
|||
get("201473_at", hgu133aSYMBOL)
|
|||
## Chunk 45
![]() |
|||
goCats = unlist(eapply(GOTERM, Ontology))
|
|||
## Chunk 46
![]() |
|||
## library("xtable")
|
|||
## Chunk 47
![]() |
|||
library("xtable")
|
|||
## Chunk 48
![]() |
|||
query = "select ontology from go_term"
|
|||
## Chunk 49
![]() |
|||
query = paste("select term from go_term where term",
|
|||
## Chunk 50
![]() |
|||
query = paste("select go_id from go_term where",
|
|||
![]() |
|||
## Chunk 52
![]() |
|||
queryAlias = function(x) {
|
|||
## Chunk 53
![]() |
|||
findEGs(dbc, c("ALL1", "AF4", "BCR", "ABL"))
|
|||
## Chunk 54
![]() |
|||
s1 = revmap(hgu133aSYMBOL)
|
|||
## Chunk 55
![]() |
|||
toTable(hgu133aGO["201473_at"])
|
|||