Fix examples with `sample.nwk`
... | ... |
@@ -156,7 +156,7 @@ scale_x_ggtree <- function(tree_view, breaks=NULL, labels=NULL) { |
156 | 156 |
## ##' @export |
157 | 157 |
## ##' @author Guangchuang Yu \url{http://ygc.name} |
158 | 158 |
## ##' @examples |
159 |
-## ##' nwk <- system.file("extdata", "sample.nwk", package="ggtree") |
|
159 |
+## ##' nwk <- system.file("extdata", "sample.nwk", package="treeio") |
|
160 | 160 |
## ##' tree <- read.tree(nwk) |
161 | 161 |
## ##' p <- ggtree(tree) |
162 | 162 |
## ##' d <- matrix(abs(rnorm(52)), ncol=4) |
... | ... |
@@ -10,7 +10,7 @@ |
10 | 10 |
##' @author Yu Guangchuang |
11 | 11 |
##' @examples |
12 | 12 |
##' library("ggplot2") |
13 |
-##' nwk <- system.file("extdata", "sample.nwk", package="ggtree") |
|
13 |
+##' nwk <- system.file("extdata", "sample.nwk", package="treeio") |
|
14 | 14 |
##' tree <- read.tree(nwk) |
15 | 15 |
##' p <- ggtree(tree) + geom_tippoint(color="#b5e521", alpha=1/4, size=10) |
16 | 16 |
##' p %<% rtree(30) |
... | ... |
@@ -32,7 +32,7 @@ |
32 | 32 |
##' @export |
33 | 33 |
##' @author Yu Guangchuang |
34 | 34 |
##' @examples |
35 |
-##' nwk <- system.file("extdata", "sample.nwk", package="ggtree") |
|
35 |
+##' nwk <- system.file("extdata", "sample.nwk", package="treeio") |
|
36 | 36 |
##' tree <- read.tree(nwk) |
37 | 37 |
##' p <- ggtree(tree) |
38 | 38 |
##' dd <- data.frame(taxa=LETTERS[1:13], |