unionLeaf {TreeSummarizedExperiment} | R Documentation |
unionLeaf
list the leaf nodes that are the desendants of (at least one)
specified nodes.
unionLeaf(tree, node)
tree |
A phylo object. |
node |
A numeric or character vector. It specifies internal nodes that are changed to leaves via their node labels or numbers. |
A phylo object.
library(ggtree) data(tinyTree) ggtree(tinyTree, ladderize = FALSE) + geom_text2(aes(label = label), color = "darkorange", hjust = -0.1, vjust = -0.7) + geom_text2(aes(label = node), color = "darkblue", hjust = -0.5, vjust = 0.7) + geom_hilight(node = 18) + geom_point2() u1 <- unionLeaf(tree = tinyTree, node = c(19, 17)) u2 <- unionLeaf(tree = tinyTree, node = c(19, 17, 7)) (u3 <- unionLeaf(tree = tinyTree, node = c(11, 17, 7)))