... | ... |
@@ -1,5 +1,6 @@ |
1 | 1 |
CHANGES IN VERSION 1.9.3 |
2 | 2 |
------------------------ |
3 |
+ o update to using !! in tidyr::gather for compatible with tidyr 0.7.0 <2017-08-03, Thu> |
|
3 | 4 |
o now geom_text2, geom_label2, geom_point2 and geom_segment2 work with ggplot2 <2017-08-01, Tue> |
4 | 5 |
o update fortify.jplace to support number of placement (nplace) <2017-07-27, Thu> |
5 | 6 |
|
... | ... |
@@ -63,7 +63,7 @@ nodebar <- function(data, cols, color, alpha=1, position="stack") { |
63 | 63 |
} |
64 | 64 |
type <- value <- NULL |
65 | 65 |
|
66 |
- ldf <- gather(data, type, value, cols) %>% split(., .$node) |
|
66 |
+ ldf <- gather(data, type, value, !! cols) %>% split(., .$node) |
|
67 | 67 |
bars <- lapply(ldf, function(df) ggplot(df, aes_(x=1, y=~value, fill=~type)) + |
68 | 68 |
geom_bar(stat='identity', alpha=alpha, position=position) + |
69 | 69 |
theme_inset() |
... | ... |
@@ -96,7 +96,7 @@ nodepie <- function(data, cols, color, alpha=1) { |
96 | 96 |
if (missingArg(color)) { |
97 | 97 |
color <- NA |
98 | 98 |
} |
99 |
- ldf <- gather(data, type, value, cols) %>% split(., .$node) |
|
99 |
+ ldf <- gather(data, type, value, !! cols) %>% split(., .$node) |
|
100 | 100 |
lapply(ldf, function(df) ggpie(df, y=~value, fill=~type, color, alpha)) |
101 | 101 |
} |
102 | 102 |
|
... | ... |
@@ -6,7 +6,7 @@ ggtree: an R package for visualization and annotation of phylogenetic trees with |
6 | 6 |
|
7 | 7 |
[](https://bioconductor.org/packages/ggtree) [](https://github.com/guangchuangyu/ggtree) [](https://www.bioconductor.org/packages/devel/bioc/html/ggtree.html#since) [](https://bioconductor.org/packages/stats/bioc/ggtree) [](https://bioconductor.org/packages/stats/bioc/ggtree) |
8 | 8 |
|
9 |
-[](http://www.repostatus.org/#active) [](https://codecov.io/gh/GuangchuangYu/ggtree) [](https://github.com/GuangchuangYu/ggtree/commits/master) [](https://github.com/GuangchuangYu/ggtree/network) [](https://github.com/GuangchuangYu/ggtree/stargazers) [](https://awesome-r.com/#awesome-r-graphic-displays) |
|
9 |
+[](http://www.repostatus.org/#active) [](https://codecov.io/gh/GuangchuangYu/ggtree) [](https://github.com/GuangchuangYu/ggtree/commits/master) [](https://github.com/GuangchuangYu/ggtree/network) [](https://github.com/GuangchuangYu/ggtree/stargazers) [](https://awesome-r.com/#awesome-r-graphic-displays) |
|
10 | 10 |
|
11 | 11 |
[](https://www.bioconductor.org/packages/devel/bioc/html/ggtree.html#archives) [](https://bioconductor.org/checkResults/devel/bioc-LATEST/ggtree/) [](https://travis-ci.org/GuangchuangYu/ggtree) [](https://ci.appveyor.com/project/GuangchuangYu/ggtree) [](#backers) [](#sponsors) |
12 | 12 |
|