[Phylobase-commits] r675 - pkg/inst/unitTests

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Sep 29 07:57:47 CEST 2009


Author: regetz
Date: 2009-09-29 07:57:47 +0200 (Tue, 29 Sep 2009)
New Revision: 675

Added:
   pkg/inst/unitTests/runit.formatData.R
Log:
created unit tests for formatData


Added: pkg/inst/unitTests/runit.formatData.R
===================================================================
--- pkg/inst/unitTests/runit.formatData.R	                        (rev 0)
+++ pkg/inst/unitTests/runit.formatData.R	2009-09-29 05:57:47 UTC (rev 675)
@@ -0,0 +1,219 @@
+#
+# --- Test formatData.R ---
+#
+
+# create phylo4 object with a full complement of valid slots
+ancestor <- as.integer(c(6,7,7,6,8,0,8,9,9))
+descendant <- as.integer(c(7,1,2,8,3,6,9,4,5))
+edge <- cbind(ancestor, descendant)
+nid.tip <- 1:5
+nid.int <- 6:9
+nid.all <- c(nid.tip, nid.int)
+lab.tip <- paste("t", nid.tip, sep="")
+lab.int <- paste("n", nid.int, sep="")
+lab.all <- c(lab.tip, lab.int)
+elen <- descendant/10
+elab <- paste("e", ancestor, descendant, sep="-")
+phy <- phylo4(x=edge, tip.label=lab.tip, node.label=lab.int,
+    edge.length=elen, edge.label=elab)
+
+# create altered version such that each slot is out of order with
+# respect to all others; methods should be able to handle this
+phy.alt <- phy
+phy.alt at label <- rev(phy at label)
+phy.alt at edge <- phy at edge[c(6:9, 1:5), ]
+phy.alt at edge.length <- phy at edge.length[c(7:9, 1:6)]
+phy.alt at edge.label <- phy at edge.label[c(8:9, 1:7)]
+
+# create data to add to phylo4 to create phylo4d, but with data rows out
+# of order
+set.seed(1)
+nid.tip.r <- sample(nid.tip)
+nid.int.r <- sample(nid.int)
+nid.all.r <- sample(c(nid.tip, nid.int))
+allDt <- data.frame(a=letters[nid.all.r], b=10*nid.all.r)
+tipDt <- data.frame(c=letters[nid.tip.r], d=10*nid.tip.r)
+nodDt <- data.frame(c=letters[nid.int.r], e=10*nid.int.r)
+## set row.names as numeric node IDs (may be changed in tests below)
+row.names(allDt) <- nid.all.r
+row.names(tipDt) <- nid.tip.r
+row.names(nodDt) <- nid.int.r
+
+#-----------------------------------------------------------------------
+
+test.formatData <- function() {
+    # function(phy, dt, type=c("tip", "internal", "all"),
+    #   match.data=TRUE, rownamesAsLabels=FALSE,
+    #   label.type=c("rownames", "column"), label.column=1,
+    #   missing.data=c("fail", "warn", "OK"),
+    #   extra.data=c("warn", "OK", "fail"), keep.all=TRUE
+
+    #
+    # matching options
+    #
+
+    ## don't match (purely positional)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=rev(nid.tip)), type="tip", match.data=FALSE),
+        data.frame(a=c(1:5, rep(NA, 4)), row.names=nid.all))
+    ## match on rownames (node numbers)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=rev(nid.tip)), type="tip", match.data=TRUE),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=rev(nid.tip)), type="tip"), data.frame(a=c(5:1,
+        rep(NA, 4)), row.names=nid.all))
+    ## match on rownames (labels)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=rev(lab.tip)), type="tip", match.data=TRUE),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    ## match on rownames (mixed node numbers and labels)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=c(rev(lab.tip)[1:3], rev(nid.tip)[4:5])),
+        type="tip", match.data=TRUE),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    ## but fails if rownamesAsLabels is TRUE
+    checkException(formatData(phy.alt, data.frame(a=1:5,
+        row.names=c(rev(lab.tip)[1:3], rev(nid.tip)[4:5])),
+        type="tip", match.data=TRUE, rownamesAsLabels=TRUE))
+
+    #
+    #   label.type="column" and label.column=2
+    #
+
+    ## should ignore label (purely positional) and retain a label col
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        lab=rev(nid.tip)), type="tip", match.data=FALSE,
+        label.type="column", label.column=2),
+        data.frame(a=c(1:5, rep(NA, 4)), lab=c(rev(nid.tip), rep(NA,
+        4)), row.names=nid.all))
+    ## match on label column (node numbers)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        lab=rev(nid.tip)), type="tip", match.data=TRUE,
+        label.type="column", label.column=2),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        lab=rev(nid.tip)), type="tip",
+        label.type="column", label.column=2),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    ## match on label column (labels)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        lab=rev(lab.tip)), type="tip", match.data=TRUE,
+        label.type="column", label.column=2),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    ## match on label column (mixed node numbers and labels)
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        lab=c(rev(lab.tip)[1:3], rev(nid.tip)[4:5])), type="tip",
+        match.data=TRUE, label.type="column", label.column=2),
+        data.frame(a=c(5:1, rep(NA, 4)), row.names=nid.all))
+    ## but fails if rownamesAsLabels is TRUE
+    checkException(formatData(phy.alt, data.frame(a=1:5,
+        lab=c(rev(lab.tip)[1:3], rev(nid.tip)[4:5])),
+        type="tip", match.data=TRUE, rownamesAsLabels=TRUE,
+        label.type="column", label.column=2))
+
+    ## try to match internal nodes when type='tips'
+    checkException(formatData(phy.alt, data.frame(a=1:5, row.names=4:8),
+        type="tip"))
+    ## and vice versa
+    checkException(formatData(phy.alt, data.frame(a=6:9, row.names=1:4),
+        type="internal"))
+
+    #
+    # missing.data
+    #
+
+    ## force error conditions
+    checkException(formatData(phy.alt, data.frame(a=1:3), type="tip"))
+    checkException(formatData(phy.alt, data.frame(a=1:3), type="tip",
+        missing.data="fail"))
+    options(warn=3)
+    checkException(formatData(phy.alt, data.frame(a=1:3), type="tip",
+        missing.data="warn"))
+    options(warn=0)
+    ## missing data with matching
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.tip)[-1],
+        row.names=rev(nid.tip)[-1]), type="tip", missing.data="OK"),
+        data.frame(a=c(nid.tip[-5], rep(NA, 5))))
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.int)[-1],
+        row.names=rev(nid.int)[-1]), type="internal", missing.data="OK"),
+        data.frame(a=c(rep(NA, 5), nid.int[-4], NA)))
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.all)[-1],
+        row.names=rev(nid.all)[-1]), type="all", missing.data="OK"),
+        data.frame(a=c(nid.all[-9], NA)))
+    ## missing data without matching
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.tip)[-1]),
+        type="tip", match.data=FALSE, missing.data="OK"),
+        data.frame(a=c(rev(nid.tip)[-1], rep(NA, 5))))
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.int)[-1]),
+        type="internal", match.data=FALSE, missing.data="OK"),
+        data.frame(a=c(rep(NA, 5), rev(nid.int)[-1], NA)))
+    checkIdentical(formatData(phy.alt, data.frame(a=rev(nid.all)[-1]),
+        type="all", match.data=FALSE, missing.data="OK"),
+        data.frame(a=c(rev(nid.all)[-1], NA)))
+
+    #
+    # extra.data
+    #
+
+    ## force error conditions
+    checkException(formatData(phy.alt, data.frame(a=1:3), type="tip",
+        missing.data="fail"))
+    options(warn=3)
+    checkException(formatData(phy.alt, data.frame(a=0:5, row.names=0:5),
+        type="tip", missing="warn"))
+    checkException(formatData(phy.alt, data.frame(a=0:5, row.names=0:5),
+        type="tip"))
+    options(warn=0)
+    ## extra data with matching
+    checkIdentical(formatData(phy.alt, data.frame(a=c(0L, rev(nid.tip)),
+        row.names=c(0, rev(nid.tip))), type="tip", extra.data="OK"),
+        data.frame(a=c(nid.tip, rep(NA, 4))))
+    checkIdentical(formatData(phy.alt, data.frame(a=c(0L, rev(nid.int)),
+        row.names=c(0, rev(nid.int))), type="internal", extra.data="OK"),
+        data.frame(a=c(rep(NA, 5), nid.int)))
+    checkIdentical(formatData(phy.alt, data.frame(a=c(0L, rev(nid.all)),
+        row.names=c(0, rev(nid.all))), type="all", extra.data="OK"),
+        data.frame(a=nid.all))
+    ## extra data without matching
+    checkIdentical(formatData(phy.alt, data.frame(a=1:15),
+        type="tip", match.data=FALSE, extra.data="OK"),
+        data.frame(a=c(1:5, rep(NA, 4))))
+    checkIdentical(formatData(phy.alt, data.frame(a=1:15),
+        type="internal", match.data=FALSE, extra.data="OK"),
+        data.frame(a=c(rep(NA, 5), 1:4)))
+    checkIdentical(formatData(phy.alt, data.frame(a=1:15),
+        type="all", match.data=FALSE, extra.data="OK"),
+        data.frame(a=c(1:9)))
+
+    ## allow both extra.data and missing.data
+    checkIdentical(formatData(phy.alt, data.frame(a=0:3, row.names=0:3),
+        type="tip", extra.data="OK", missing.data="OK"),
+        data.frame(a=c(1:3, rep(NA, 6))))
+
+    #
+    # keep.all
+    #
+
+    ## keep all rows
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=nid.tip), type="tip", keep.all=TRUE),
+        data.frame(a=c(1:5, rep(NA, 4)), row.names=nid.all))
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=nid.tip), type="tip"),
+        data.frame(a=c(1:5, rep(NA, 4)), row.names=nid.all))
+    checkIdentical(formatData(phy.alt, data.frame(a=6:9,
+        row.names=nid.int), type="internal", keep.all=TRUE),
+        data.frame(a=c(rep(NA, 5), 6:9), row.names=nid.all))
+    checkIdentical(formatData(phy.alt, data.frame(a=6:9,
+        row.names=nid.int), type="internal"),
+        data.frame(a=c(rep(NA, 5), 6:9), row.names=nid.all))
+    ## only keep 'type' rows
+    checkIdentical(formatData(phy.alt, data.frame(a=1:5,
+        row.names=nid.tip), type="tip", keep.all=FALSE),
+        data.frame(a=c(1:5), row.names=nid.tip))
+    checkIdentical(formatData(phy.alt, data.frame(a=6:9,
+        row.names=nid.int), type="internal", keep.all=FALSE),
+        data.frame(a=c(6:9), row.names=nid.int))
+
+}


Property changes on: pkg/inst/unitTests/runit.formatData.R
___________________________________________________________________
Name: svn:eol-style
   + native



More information about the Phylobase-commits mailing list