...
|
...
|
@@ -6,11 +6,13 @@
|
6
|
6
|
#' @rdname cytobank2GatingSet
|
7
|
7
|
#' @examples
|
8
|
8
|
#' \dontrun{
|
9
|
|
-#' xmlfile <- system.file("extdata/cytotrol_tcell_cytobank.xml", package = "CytoML")
|
10
|
|
-#' fcsFiles <- list.files(pattern = "CytoTrol",
|
11
|
|
-#' system.file("extdata", package = "flowWorkspaceData"), full = TRUE)
|
12
|
|
-#' gs <- cytobank2GatingSet(xmlfile, fcsFiles)
|
13
|
|
-#' #plotGate(gs[[1]])
|
|
9
|
+#' acsfile <- system.file("extdata/cytobank_experiment.acs", package = "CytoML")
|
|
10
|
+#' ce <- cytobankExperiment(acsfile)
|
|
11
|
+#' xmlfile <- ce$gatingML
|
|
12
|
+#' fcsFiles <- list.files(ce$fcsdir, full.names = TRUE)
|
|
13
|
+#' gs <<- cytobank2GatingSet(xmlfile, fcsFiles)
|
|
14
|
+#' library(ggcyto)
|
|
15
|
+#' autoplot(gs[[1]])
|
14
|
16
|
#' }
|
15
|
17
|
#' @importFrom flowWorkspace GatingSet transform
|
16
|
18
|
#' @importFrom ncdfFlow read.ncdfFlowSet
|
...
|
...
|
@@ -42,12 +44,11 @@ cytobank2GatingSet.default <- function(x, FCS){
|
42
|
44
|
#' @export compare.counts
|
43
|
45
|
#' @examples
|
44
|
46
|
#'
|
45
|
|
-#' xmlfile <- system.file("extdata/cytotrol_tcell_cytobank.xml", package = "CytoML")
|
46
|
|
-#' fcsFiles <- list.files(pattern = "CytoTrol",
|
47
|
|
-#' system.file("extdata", package = "flowWorkspaceData"), full = TRUE)
|
48
|
|
-#' gs <- cytobank2GatingSet(xmlfile, fcsFiles)
|
|
47
|
+#' acsfile <- system.file("extdata/cytobank_experiment.acs", package = "CytoML")
|
|
48
|
+#' ce <- cytobankExperiment(acsfile)
|
|
49
|
+#' gs <- cytobank2GatingSet(ce)
|
49
|
50
|
#' ## verify the stats are correct
|
50
|
|
-#' statsfile <- system.file("extdata/cytotrol_tcell_cytobank_counts.csv", package = "CytoML")
|
|
51
|
+#' statsfile <- ce$attachments[1]
|
51
|
52
|
#' dt_merged <- compare.counts(gs, statsfile, id.vars = "population", skip = "FCS Filename")
|
52
|
53
|
#' all.equal(dt_merged[, count.x], dt_merged[, count.y], tol = 5e-4)
|
53
|
54
|
#'
|