## Chunk 1
|
|||
apropos("mean")
|
|||
## Chunk 2
|
|||
## help.search("mean")
|
|||
|
|||
|
|||
|
|||
## Chunk 6
|
|||
## source("http://bioconductor.org/biocLite.R")
|
|||
## Chunk 7
|
|||
## source("http://bioconductor.org/biocLite.R")
|
|||
|
|||
|
|||
|
|||
|
|||
|
|||
|
|||
## Chunk 14
|
|||
sq1 = function(x) return(x*x)
|
|||
|
|||
## Chunk 16
|
|||
library("hgu95av2.db")
|
|||
## Chunk 17
|
|||
myPos = eapply(hgu95av2MAP, function(x) grep("^17p", x,
|
|||
## Chunk 18
|
|||
f17p = function(x) grep("^17p", x, value=TRUE)
|
|||
|
|||
## Chunk 20
|
|||
e1 = new.env(hash=TRUE)
|
|||
|
|||
|
|||
|
|||
## Chunk 24
|
|||
## library(convert)
|
|||
## Chunk 25
|
|||
dataDirectory = system.file("extdata", package="Biobase")
|
|||
## Chunk 26
|
|||
## exprsFile = "c:/path/to/exprsData.txt"
|
|||
## Chunk 27
|
|||
class(exprs)
|
|||
## Chunk 28
|
|||
pDataFile = file.path(dataDirectory, "pData.txt")
|
|||
## Chunk 29
|
|||
all(rownames(pData) == colnames(exprs))
|
|||
|
|||
|
|||
|
|||
|
|||
## Chunk 34
|
|||
metadata = data.frame(labelDescription=c("Patient gender",
|
|||
## Chunk 35
|
|||
adf = new("AnnotatedDataFrame", data=pData,
|
|||
## Chunk 36
|
|||
head(pData(adf))
|
|||
## Chunk 37
|
|||
annotation = "hgu95av2"
|
|||
## Chunk 38
|
|||
experimentData = new("MIAME", name="Pierre Fermat",
|
|||
## Chunk 39
|
|||
exampleSet = new("ExpressionSet", exprs=exprs,
|
|||
## Chunk 40
|
|||
minimalSet = new("ExpressionSet", exprs=exprs)
|
|||
## Chunk 41
|
|||
## help("ExpressionSet-class")
|
|||
## Chunk 42
|
|||
exampleSet
|
|||
## Chunk 43
|
|||
exampleSet$gender[1:5]
|
|||
## Chunk 44
|
|||
featureNames(exampleSet)[1:5]
|
|||
## Chunk 45
|
|||
sampleNames(exampleSet)[1:5]
|
|||
## Chunk 46
|
|||
mat = exprs(exampleSet)
|
|||
## Chunk 47
|
|||
vv = exampleSet[1:5, 1:3]
|
|||
## Chunk 48
|
|||
males = exampleSet[, exampleSet$gender == "Male"]
|
|||
## Chunk 49
|
|||
x = exprs(exampleSet[, 1])
|
|||
|
|||
## Chunk 51
|
|||
library("CLL")
|
|||
## Chunk 52
|
|||
iab = with(hgu95av2probe, xy2indices(x, y,
|
|||
## Chunk 53
|
|||
colorfunction = colorRampPalette(brewer.pal(9, "GnBu"))
|
|||
## Chunk 54
|
|||
tab = table(probedata$gc)
|
|||
## Chunk 55
|
|||
library("geneplotter")
|
|||
|