| transform.ProbeSet {affypdnn} | R Documentation |
A function to transform the PMs and MMs in a ProbeSet
transform.ProbeSet(x, fun = I, ...)
x |
object of ProbeSet-class |
fun |
a function. The identity function by default. |
... |
optional arguments for fun |
The function fun is applied to the slots pm and
mm.
The function vsnh in the package vsn is a recommended
argument for fun.
An object of class ProbeSet.
This function should make to the package affy for the version
1.4.x.
Laurent
library(affydata) data(Dilution) ppset.name <- sample(geneNames(Dilution), 1) ppset <- probeset(Dilution, ppset.name)[[1]] ppset.log <- transform(ppset, fun=log) par(mfrow=c(1,2)) plot(ppset) plot(ppset.log)