### R code from vignette source 'vignettes/flowWorkspace/inst/doc/flowWorkspace.Rnw' ################################################### ### code chunk number 1: loadlib ################################################### library(flowWorkspace) ################################################### ### code chunk number 2: findxml ################################################### d<-system.file("extdata",package="flowWorkspaceData"); wsfile<-list.files(d,pattern="A2004Analysis.xml",full=T) ################################################### ### code chunk number 3: openws ################################################### ws<-openWorkspace(wsfile) summary(ws) ################################################### ### code chunk number 4: parsews ################################################### G<-parseWorkspace(ws,name=1,path=ws@path,isNcdf=FALSE,cleanup=FALSE,keep.indices=TRUE); #import the first group #Lots of output here suppressed for the vignette. ################################################### ### code chunk number 5: summary ################################################### G ################################################### ### code chunk number 6: plotGH ################################################### gh<-G[[1]] plot(gh) ################################################### ### code chunk number 7: getNodes ################################################### nodelist<-getNodes(gh) nodelist ################################################### ### code chunk number 8: getNodes-prefix ################################################### getNodes(gh,prefix=TRUE) ################################################### ### code chunk number 9: getNodes-path ################################################### getNodes(gh,isPath=TRUE) ################################################### ### code chunk number 10: getGate ################################################### node<-nodelist[3] g<-getGate(gh,node) g ################################################### ### code chunk number 11: getBound ################################################### getBoundaries(gh,node) ################################################### ### code chunk number 12: getProp ################################################### getProp(gh,node) ################################################### ### code chunk number 13: getStats ################################################### getPopStats(gh) ################################################### ### code chunk number 14: plotPCV ################################################### print(plotPopCV(gh)) ################################################### ### code chunk number 15: plotGate ################################################### plotGate(gh,nodelist[6],lwd=2,cex=2) ################################################### ### code chunk number 16: plotGate-overlay ################################################### plotGate(gh,y=nodelist[6],overlay=7) ################################################### ### code chunk number 17: annotate ################################################### d<-data.frame(sample=factor(c("sample 1", "sample 2")),treatment=factor(c("sample","control")) ) pd<-pData(G) pd<-cbind(pd,d) pData(G)<-pd pData(G); ################################################### ### code chunk number 18: getData-gh ################################################### getData(gh,node) ################################################### ### code chunk number 19: getData-G ################################################### getData(G,node); ################################################### ### code chunk number 20: getInd ################################################### table(getIndices(gh,node)) ################################################### ### code chunk number 21: getCMAT ################################################### C<-getCompensationMatrices(ws); C ################################################### ### code chunk number 22: getTrans ################################################### T<-getTransformations(ws) names(T) names(T[[1]]) T[[1]][[1]] ################################################### ### code chunk number 23: tnames ################################################### A<-names(T) B<-names(T[[1]]) ################################################### ### code chunk number 24: getsamples ################################################### getSamples(ws); ################################################### ### code chunk number 25: getgroups ################################################### getSampleGroups(ws) ################################################### ### code chunk number 26: create gs ################################################### data(GvHD) #select raw flow data fs<-GvHD[1:3] ################################################### ### code chunk number 27: transform ################################################### tf <- transformList(colnames(fs[[1]])[3:6], asinh, transformationId="asinh") fs_trans<-transform(fs,tf) ################################################### ### code chunk number 28: create gs ################################################### gs <- GatingSet(fs_trans) gs gh1<-gs[[1]] getNodes(gh1) ################################################### ### code chunk number 29: add-rectGate ################################################### rg <- rectangleGate("FSC-H"=c(200,400), "SSC-H"=c(250, 400), filterId="rectangle") nodeID<-add(gs, rg) nodeID getNodes(gh1) ################################################### ### code chunk number 30: add-quadGate ################################################### qg <- quadGate("FL1-H"=2, "FL2-H"=4) nodeIDs<-add(gs,qg,parent="rectangle") nodeIDs getNodes(gh1) ################################################### ### code chunk number 31: add-boolGate ################################################### bg<-booleanFilter(`CD15 FITC-CD45 PE+|CD15 FITC+CD45 PE-`) bg nodeID2<-add(gs,bg,parent="rectangle") nodeID2 getNodes(gh1) ################################################### ### code chunk number 32: recompute ################################################### recompute(gs) ################################################### ### code chunk number 33: plotGate-rect ################################################### plotGate(gh1,"rectangle") #plot one Gate ################################################### ### code chunk number 34: plotGate-multiple ################################################### plotGate(gh1,nodeIDs) ################################################### ### code chunk number 35: plotGate-gh-all ################################################### plotGate(gh1) ################################################### ### code chunk number 36: plotGate-gh-bool (eval = FALSE) ################################################### ## plotGate(gh1,bool=TRUE) ################################################### ### code chunk number 37: plotGate-gs ################################################### plotGate(gs,nodeID) ################################################### ### code chunk number 38: plot-gh (eval = FALSE) ################################################### ## plot(gh1,bool=TRUE) ################################################### ### code chunk number 39: rm ################################################### Rm('rectangle', gs) getNodes(gh1) ################################################### ### code chunk number 40: archive (eval = FALSE) ################################################### ## archive(gs,file="gs.tar") ## G1<-unarchive(file="gs.tar") ################################################### ### code chunk number 41: clone (eval = FALSE) ################################################### ## gs_cloned<-clone(gs)