Browse code

just in case fix examples in experimental function gplot

Vladimir Mikryukov authored on 27/09/2018 04:12:26
Showing 1 changed files

... ...
@@ -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)