################################################### ### chunk number 1: options ################################################### options(width=60) ################################################### ### chunk number 2: loadSnpCallSet ################################################### library(SNPchip) data(crlmmOut) class(crlmmOut) ################################################### ### chunk number 3: assayData ################################################### annotation(crlmmOut) ls(assayData(crlmmOut)) callset <- crlmmOut ################################################### ### chunk number 4: eval=FALSE ################################################### ## library("oligo") ## library("hapmap100kxba") ## pathCelFiles <- system.file("celFiles", package="hapmap100kxba") ## fullFilenames <- list.celfiles(path=pathCelFiles, full.names=TRUE) ## aboutSamples <- data.frame(gender=c("female", "female", "male")) ## rownames(aboutSamples) <- basename(fullFilenames) ## aboutVars <- data.frame(labelDescription="male/female") ## rownames(aboutVars) <- "gender" ## pd <- new("AnnotatedDataFrame", ## data=aboutSamples, ## varMetadata=aboutVars) ## xba <- justCRLMM(fullFilenames, phenoData=pd, verbose=FALSE) ## ## library("hapmap100khind") ## pathCelFiles <- system.file("celFiles", package="hapmap100khind") ## fullFilenames <- list.celfiles(path=pathCelFiles, full.names=TRUE) ## aboutSamples <- data.frame(gender=c("female", "female", "male")) ## rownames(aboutSamples) <- basename(fullFilenames) ## aboutVars <- data.frame(labelDescription="male/female") ## rownames(aboutVars) <- "gender" ## pd <- new("AnnotatedDataFrame", ## data=aboutSamples, ## varMetadata=aboutVars) ## hind <- justCRLMM(fullFilenames, phenoData=pd, verbose=FALSE) ################################################### ### chunk number 5: eval=FALSE ################################################### ## callset <- combine(xba, hind) ################################################### ### chunk number 6: sessionInfo ################################################### toLatex(sessionInfo())