Browse code

add extend parameter in geom_cladelabel

guangchuang yu authored on 26/07/2017 02:13:53
Showing 101 changed files

... ...
@@ -43,4 +43,4 @@ BugReports: https://github.com/GuangchuangYu/ggtree/issues
43 43
 Packaged: 2014-12-03 08:16:14 UTC; root
44 44
 biocViews: Alignment, Annotation, Clustering, DataImport,
45 45
     MultipleSequenceAlignment, ReproducibleResearch, Software, Visualization
46
-RoxygenNote: 5.0.1
46
+RoxygenNote: 6.0.1
... ...
@@ -1,5 +1,7 @@
1 1
 CHANGES IN VERSION 1.9.2
2 2
 ------------------------
3
+ o extend parameter in geom_cladebar <2017-07-26, Wed>
4
+   + https://github.com/GuangchuangYu/ggtree/issues/142#issuecomment-317817995
3 5
  o scaleClade works after calling viewClade <2017-07-20, Thu>
4 6
    + https://groups.google.com/forum/?utm_medium=email&utm_source=footer#!topic/bioc-ggtree/QVSryszPaFY
5 7
  o gheatmap support handling collapsed tree <2017-06-29, Thu>
... ...
@@ -6,6 +6,7 @@
6 6
 ##' @param label clade label
7 7
 ##' @param offset offset of bar and text from the clade
8 8
 ##' @param offset.text offset of text from bar
9
+##' @param extend extend bar height
9 10
 ##' @param align logical
10 11
 ##' @param barsize size of bar
11 12
 ##' @param fontsize size of text
... ...
@@ -20,11 +21,21 @@
20 21
 ##' @return ggplot layers
21 22
 ##' @export
22 23
 ##' @author Guangchuang Yu
23
-geom_cladelabel <- function(node, label, offset=0, offset.text=0,
24
-                            align=FALSE, barsize=0.5, fontsize=3.88,
25
-                            angle=0, geom="text", hjust = 0,
26
-                            color = NULL, fill=NA,
27
-                            family="sans", parse=FALSE, ...) {
24
+geom_cladelabel <- function(node, label,
25
+                            offset      = 0,
26
+                            offset.text = 0,
27
+                            extend      = 0,
28
+                            align       = FALSE,
29
+                            barsize     = 0.5,
30
+                            fontsize    = 3.88,
31
+                            angle       = 0,
32
+                            geom        = "text",
33
+                            hjust       = 0,
34
+                            color       = NULL,
35
+                            fill        = NA,
36
+                            family      = "sans",
37
+                            parse       = FALSE,
38
+                            ...) {
28 39
     mapping <- NULL
29 40
     data <- NULL
30 41
     position <- "identity"
... ...
@@ -73,7 +84,7 @@ geom_cladelabel <- function(node, label, offset=0, offset.text=0,
73 84
         }
74 85
 
75 86
         layer_bar <- stat_cladeBar(node=node, offset=offset, align=align,
76
-                                   size=barsize,
87
+                                   size=barsize, extend = extend,
77 88
                                    mapping=mapping, data=data,
78 89
                                    position=position, show.legend = show.legend,
79 90
                                    inherit.aes = inherit.aes, na.rm=na.rm, ...)
... ...
@@ -95,11 +106,18 @@ geom_cladelabel <- function(node, label, offset=0, offset.text=0,
95 106
                                         parse = parse,  ...)
96 107
         }
97 108
 
98
-        layer_bar <- stat_cladeBar(node=node, offset=offset, align=align,
99
-                                   size=barsize, color = barcolor,
100
-                                   mapping=mapping, data=data,
101
-                                   position=position, show.legend = show.legend,
102
-                                   inherit.aes = inherit.aes, na.rm=na.rm, ...)
109
+        layer_bar <- stat_cladeBar(node        = node,
110
+                                   offset      = offset,
111
+                                   align       = align,
112
+                                   size        = barsize,
113
+                                   color       = barcolor,
114
+                                   extend      = extend,
115
+                                   mapping     = mapping,
116
+                                   data        = data,
117
+                                   position    = position,
118
+                                   show.legend = show.legend,
119
+                                   inherit.aes = inherit.aes,
120
+                                   na.rm       = na.rm, ...)
103 121
 
104 122
     }
105 123
 
... ...
@@ -110,11 +128,11 @@ geom_cladelabel <- function(node, label, offset=0, offset.text=0,
110 128
 }
111 129
 
112 130
 
113
-stat_cladeText <- function(mapping=NULL, data=NULL,
114
-                           geom="text", position="identity",
131
+stat_cladeText <- function(mapping = NULL, data = NULL,
132
+                           geom = "text", position = "identity",
115 133
                            node, label, offset, align, ..., angle,
116
-                           show.legend=NA, inherit.aes=FALSE,
117
-                           na.rm=FALSE, parse=FALSE) {
134
+                           show.legend = NA, inherit.aes = FALSE,
135
+                           na.rm = FALSE, parse = FALSE) {
118 136
     default_aes <- aes_(x=~x, y=~y, node=~node, parent=~parent, angle=~angle)
119 137
     if (is.null(mapping)) {
120 138
         mapping <- default_aes
... ...
@@ -122,14 +140,14 @@ stat_cladeText <- function(mapping=NULL, data=NULL,
122 140
         mapping <- modifyList(mapping, default_aes)
123 141
     }
124 142
 
125
-    layer(stat=StatCladeText,
126
-          data=data,
127
-          mapping=mapping,
128
-          geom=geom,
129
-          position=position,
143
+    layer(stat = StatCladeText,
144
+          data = data,
145
+          mapping = mapping,
146
+          geom = geom,
147
+          position = position,
130 148
           show.legend = show.legend,
131 149
           inherit.aes = inherit.aes,
132
-          params=list(node=node,
150
+          params=list(node   = node,
133 151
                       label  = label,
134 152
                       offset = offset,
135 153
                       align  = align,
... ...
@@ -144,7 +162,7 @@ stat_cladeText <- function(mapping=NULL, data=NULL,
144 162
 
145 163
 stat_cladeBar <- function(mapping=NULL, data=NULL,
146 164
                           geom="segment", position="identity",
147
-                          node, offset, align,  ...,
165
+                          node, offset, align, extend,  ...,
148 166
                           show.legend=NA, inherit.aes=FALSE, na.rm=FALSE) {
149 167
     default_aes <- aes_(x=~x, y=~y, node=~node, parent=~parent, xend=~x, yend=~y)
150 168
     if (is.null(mapping)) {
... ...
@@ -153,17 +171,18 @@ stat_cladeBar <- function(mapping=NULL, data=NULL,
153 171
         mapping <- modifyList(mapping, default_aes)
154 172
     }
155 173
 
156
-    layer(stat=StatCladeBar,
157
-          data=data,
158
-          mapping=mapping,
159
-          geom=geom,
160
-          position=position,
174
+    layer(stat = StatCladeBar,
175
+          data = data,
176
+          mapping = mapping,
177
+          geom = geom,
178
+          position = position,
161 179
           show.legend = show.legend,
162 180
           inherit.aes = inherit.aes,
163
-          params=list(node=node,
164
-                      offset=offset,
165
-                      align=align,
166
-                      na.rm=na.rm,
181
+          params = list(node = node,
182
+                      offset = offset,
183
+                      extend = extend,
184
+                      align  = align,
185
+                      na.rm  = na.rm,
167 186
                       ...),
168 187
           check.aes = FALSE
169 188
           )
... ...
@@ -182,15 +201,15 @@ StatCladeText <- ggproto("StatCladeText", Stat,
182 201
 
183 202
 
184 203
 StatCladeBar <- ggproto("StatCladBar", Stat,
185
-                        compute_group = function(self, data, scales, params, node, offset, align) {
186
-                            get_cladelabel_position(data, node, offset, align, adjustRatio=1.02, angle=0)
204
+                        compute_group = function(self, data, scales, params, node, offset, align, extend) {
205
+                            get_cladelabel_position(data, node, offset, align, adjustRatio=1.02, angle=0, extend=extend)
187 206
                         },
188 207
                         required_aes = c("x", "y", "xend", "yend")
189 208
                         )
190 209
 
191 210
 
192
-get_cladelabel_position <- function(data, node, offset, align, adjustRatio, angle="auto") {
193
-    df <- get_cladelabel_position_(data, node, angle)
211
+get_cladelabel_position <- function(data, node, offset, align, adjustRatio, angle="auto", extend=0) {
212
+    df <- get_cladelabel_position_(data, node, angle, extend)
194 213
     if (align) {
195 214
         mx <- max(data$x, na.rm=TRUE)
196 215
     } else {
... ...
@@ -203,12 +222,12 @@ get_cladelabel_position <- function(data, node, offset, align, adjustRatio, angl
203 222
     ## }
204 223
 
205 224
     mx <- mx * adjustRatio + offset
206
-    
225
+
207 226
     data.frame(x=mx, xend=mx, y=df$y, yend=df$yend, angle=angle)
208 227
 }
209 228
 
210 229
 
211
-get_cladelabel_position_ <- function(data, node, angle="auto") {
230
+get_cladelabel_position_ <- function(data, node, angle = "auto", extend = 0) {
212 231
     sp <- get.offspring.df(data, node)
213 232
     sp2 <- c(sp, node)
214 233
     sp.df <- data[match(sp2, data$node),]
... ...
@@ -217,7 +236,7 @@ get_cladelabel_position_ <- function(data, node, angle="auto") {
217 236
     y <- y[!is.na(y)]
218 237
     mx <- max(sp.df$x, na.rm=TRUE)
219 238
 
220
-    d <- data.frame(x=mx, y=min(y), yend=max(y))
239
+    d <- data.frame(x=mx, y=min(y) - extend, yend=max(y) + extend)
221 240
     if (missing(angle))
222 241
         return(d)
223 242
 
... ...
@@ -226,6 +245,7 @@ get_cladelabel_position_ <- function(data, node, angle="auto") {
226 245
     } else {
227 246
         d$angle <- angle
228 247
     }
248
+
229 249
     return(d)
230 250
 }
231 251
 
... ...
@@ -6,7 +6,7 @@ ggtree: an R package for visualization and annotation of phylogenetic trees with
6 6
 
7 7
 [![](https://img.shields.io/badge/release%20version-1.8.1-green.svg?style=flat)](https://bioconductor.org/packages/ggtree) [![](https://img.shields.io/badge/devel%20version-1.9.2-green.svg?style=flat)](https://github.com/guangchuangyu/ggtree) [![Bioc](http://www.bioconductor.org/shields/years-in-bioc/ggtree.svg)](https://www.bioconductor.org/packages/devel/bioc/html/ggtree.html#since) [![](https://img.shields.io/badge/download-17269/total-blue.svg?style=flat)](https://bioconductor.org/packages/stats/bioc/ggtree) [![](https://img.shields.io/badge/download-885/month-blue.svg?style=flat)](https://bioconductor.org/packages/stats/bioc/ggtree)
8 8
 
9
-[![Project Status: Active - The project has reached a stable, usable state and is being actively developed.](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active) [![codecov](https://codecov.io/gh/GuangchuangYu/ggtree/branch/master/graph/badge.svg)](https://codecov.io/gh/GuangchuangYu/ggtree) [![Last-changedate](https://img.shields.io/badge/last%20change-2017--07--25-green.svg)](https://github.com/GuangchuangYu/ggtree/commits/master) [![GitHub forks](https://img.shields.io/github/forks/GuangchuangYu/ggtree.svg)](https://github.com/GuangchuangYu/ggtree/network) [![GitHub stars](https://img.shields.io/github/stars/GuangchuangYu/ggtree.svg)](https://github.com/GuangchuangYu/ggtree/stargazers) [![Awesome](https://cdn.rawgit.com/sindresorhus/awesome/d7305f38d29fed78fa85652e3a63e154dd8e8829/media/badge.svg)](https://awesome-r.com/#awesome-r-graphic-displays)
9
+[![Project Status: Active - The project has reached a stable, usable state and is being actively developed.](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active) [![codecov](https://codecov.io/gh/GuangchuangYu/ggtree/branch/master/graph/badge.svg)](https://codecov.io/gh/GuangchuangYu/ggtree) [![Last-changedate](https://img.shields.io/badge/last%20change-2017--07--26-green.svg)](https://github.com/GuangchuangYu/ggtree/commits/master) [![GitHub forks](https://img.shields.io/github/forks/GuangchuangYu/ggtree.svg)](https://github.com/GuangchuangYu/ggtree/network) [![GitHub stars](https://img.shields.io/github/stars/GuangchuangYu/ggtree.svg)](https://github.com/GuangchuangYu/ggtree/stargazers) [![Awesome](https://cdn.rawgit.com/sindresorhus/awesome/d7305f38d29fed78fa85652e3a63e154dd8e8829/media/badge.svg)](https://awesome-r.com/#awesome-r-graphic-displays)
10 10
 
11 11
 [![platform](http://www.bioconductor.org/shields/availability/devel/ggtree.svg)](https://www.bioconductor.org/packages/devel/bioc/html/ggtree.html#archives) [![Build Status](http://www.bioconductor.org/shields/build/devel/bioc/ggtree.svg)](https://bioconductor.org/checkResults/devel/bioc-LATEST/ggtree/) [![Linux/Mac Travis Build Status](https://img.shields.io/travis/GuangchuangYu/ggtree/master.svg?label=Mac%20OSX%20%26%20Linux)](https://travis-ci.org/GuangchuangYu/ggtree) [![AppVeyor Build Status](https://img.shields.io/appveyor/ci/Guangchuangyu/ggtree/master.svg?label=Windows)](https://ci.appveyor.com/project/GuangchuangYu/ggtree) [![Backers on Open Collective](https://opencollective.com/ggtree/backers/badge.svg)](#backers) [![Sponsors on Open Collective](https://opencollective.com/ggtree/sponsors/badge.svg)](#sponsors)
12 12
 
... ...
@@ -27,7 +27,7 @@ Please cite the following article when using `ggtree`:
27 27
 
28 28
 **G Yu**, DK Smith, H Zhu, Y Guan, TTY Lam<sup>\*</sup>. ggtree: an R package for visualization and annotation of phylogenetic trees with their covariates and other associated data. ***Methods in Ecology and Evolution***. 2017, 8(1):28-36.
29 29
 
30
-[![](https://img.shields.io/badge/doi-10.1111/2041--210X.12628-green.svg?style=flat)](http://dx.doi.org/10.1111/2041-210X.12628) [![](https://img.shields.io/badge/Altmetric-351-green.svg?style=flat)](https://www.altmetric.com/details/10533079) [![citation](https://img.shields.io/badge/cited%20by-28-green.svg?style=flat)](https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627)
30
+[![](https://img.shields.io/badge/doi-10.1111/2041--210X.12628-green.svg?style=flat)](http://dx.doi.org/10.1111/2041-210X.12628) [![](https://img.shields.io/badge/Altmetric-351-green.svg?style=flat)](https://www.altmetric.com/details/10533079) [![citation](https://img.shields.io/badge/cited%20by-29-green.svg?style=flat)](https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627)
31 31
 
32 32
 ------------------------------------------------------------------------
33 33
 
34 34
Binary files a/docs/images/citation.png and b/docs/images/citation.png differ
... ...
@@ -18,4 +18,3 @@ convert Date to decimal format, eg "2014-05-05" to "2014.34"
18 18
 \author{
19 19
 Guangchuang Yu
20 20
 }
21
-
... ...
@@ -17,4 +17,3 @@ list of all child node id's from starting node.
17 17
 \description{
18 18
 Get all children of node from df tree using breath-first.
19 19
 }
20
-
... ...
@@ -18,4 +18,3 @@ named list of subtrees with the root id of subtree and list of node id's making
18 18
 Get all subtrees of specified node. This includes all ancestors and relatives of node and
19 19
 return named list of subtrees.
20 20
 }
21
-
... ...
@@ -20,4 +20,3 @@ Find Most Recent Common Ancestor among a vector of tips
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -31,4 +31,3 @@ print(tree)
31 31
 \author{
32 32
 ygc
33 33
 }
34
-
... ...
@@ -30,4 +30,3 @@ p \%<+\% dd + geom_text(aes(color=place, label=label), hjust=-0.5)
30 30
 \author{
31 31
 Yu Guangchuang
32 32
 }
33
-
... ...
@@ -20,4 +20,3 @@ update data with tree info (y coordination and panel)
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -29,4 +29,3 @@ add colorbar legend
29 29
 \author{
30 30
 Guangchuang Yu
31 31
 }
32
-
... ...
@@ -31,4 +31,3 @@ annotation taxa with images
31 31
 \author{
32 32
 Guangchuang Yu
33 33
 }
34
-
... ...
@@ -20,4 +20,3 @@ merge phylo and output of boot.phylo to 'apeBootstrap' object
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -18,4 +18,3 @@ list with tree data.frame with updated layout using daylight algorithm and max_c
18 18
 Apply the daylight alorithm to adjust the spacing between the subtrees and tips of the
19 19
 specified node.
20 20
 }
21
-
... ...
@@ -30,4 +30,3 @@ is.binary.tree(tr2)
30 30
 \author{
31 31
 Guangchuang Yu \url{http://ygc.name}
32 32
 }
33
-
... ...
@@ -27,4 +27,3 @@ convert phylo to data.frame
27 27
 \author{
28 28
 Yu Guangchuang
29 29
 }
30
-
... ...
@@ -22,4 +22,3 @@ collapse binary tree to polytomy by applying 'fun' to 'feature'
22 22
 \author{
23 23
 Guangchuang
24 24
 }
25
-
... ...
@@ -17,10 +17,9 @@ tree view
17 17
 \description{
18 18
 collapse a clade
19 19
 }
20
-\author{
21
-Guangchuang Yu
22
-}
23 20
 \seealso{
24 21
 expand
25 22
 }
26
-
23
+\author{
24
+Guangchuang Yu
25
+}
... ...
@@ -18,4 +18,3 @@ convert decimal format to Date, eg "2014.34" to "2014-05-05"
18 18
 \author{
19 19
 Guangchuang Yu
20 20
 }
21
-
... ...
@@ -21,4 +21,3 @@ capture name of variable
21 21
 x <- 1
22 22
 eval(.(x)[[1]])
23 23
 }
24
-
... ...
@@ -24,4 +24,3 @@ download phylopic
24 24
 \author{
25 25
 Guangchuang Yu
26 26
 }
27
-
... ...
@@ -17,10 +17,9 @@ tree view
17 17
 \description{
18 18
 expand collased clade
19 19
 }
20
-\author{
21
-Guangchuang Yu
22
-}
23 20
 \seealso{
24 21
 collapse
25 22
 }
26
-
23
+\author{
24
+Guangchuang Yu
25
+}
... ...
@@ -28,4 +28,3 @@ plot tree associated data in an additional panel
28 28
 \author{
29 29
 Guangchuang Yu
30 30
 }
31
-
... ...
@@ -22,4 +22,3 @@ flip position of two selected branches
22 22
 \author{
23 23
 Guangchuang Yu
24 24
 }
25
-
... ...
@@ -33,4 +33,3 @@ fortify a phylo to data.frame
33 33
 \author{
34 34
 Yu Guangchuang
35 35
 }
36
-
... ...
@@ -24,4 +24,3 @@ add horizontal align lines
24 24
 \author{
25 25
 Yu Guangchuang
26 26
 }
27
-
... ...
@@ -30,11 +30,10 @@ highlights the two direct descendant clades of an internal node
30 30
 Particularly useful when studying neighboring clades. Note that balances that
31 31
 correspond to multichotomies will not be displayed.
32 32
 }
33
-\author{
34
-Justin Silverman
35
-}
36 33
 \references{
37 34
 J. Silverman, et al. \emph{A phylogenetic transform enhances
38 35
   analysis of compositional microbiota data}. (in preparation)
39 36
 }
40
-
37
+\author{
38
+Justin Silverman
39
+}
... ...
@@ -4,9 +4,10 @@
4 4
 \alias{geom_cladelabel}
5 5
 \title{geom_cladelabel}
6 6
 \usage{
7
-geom_cladelabel(node, label, offset = 0, offset.text = 0, align = FALSE,
8
-  barsize = 0.5, fontsize = 3.88, angle = 0, geom = "text", hjust = 0,
9
-  color = NULL, fill = NA, family = "sans", parse = FALSE, ...)
7
+geom_cladelabel(node, label, offset = 0, offset.text = 0, extend = 0,
8
+  align = FALSE, barsize = 0.5, fontsize = 3.88, angle = 0,
9
+  geom = "text", hjust = 0, color = NULL, fill = NA, family = "sans",
10
+  parse = FALSE, ...)
10 11
 }
11 12
 \arguments{
12 13
 \item{node}{selected node}
... ...
@@ -17,6 +18,8 @@ geom_cladelabel(node, label, offset = 0, offset.text = 0, align = FALSE,
17 18
 
18 19
 \item{offset.text}{offset of text from bar}
19 20
 
21
+\item{extend}{extend bar height}
22
+
20 23
 \item{align}{logical}
21 24
 
22 25
 \item{barsize}{size of bar}
... ...
@@ -48,4 +51,3 @@ annotate a clade with bar and text label
48 51
 \author{
49 52
 Guangchuang Yu
50 53
 }
51
-
... ...
@@ -27,4 +27,3 @@ layer of hilight clade with rectangle
27 27
 \author{
28 28
 Guangchuang Yu
29 29
 }
30
-
... ...
@@ -45,10 +45,9 @@ label layer
45 45
 \description{
46 46
 geom_label2 support aes(subset) via setup_data
47 47
 }
48
-\author{
49
-Guangchuang Yu
50
-}
51 48
 \seealso{
52 49
 \link[ggplot2]{geom_label}
53 50
 }
54
-
51
+\author{
52
+Guangchuang Yu
53
+}
... ...
@@ -31,4 +31,3 @@ add node point
31 31
 \author{
32 32
 Guangchuang Yu
33 33
 }
34
-
... ...
@@ -28,10 +28,9 @@ point layer
28 28
 \description{
29 29
 geom_point2 support aes(subset) via setup_data
30 30
 }
31
-\author{
32
-Guangchuang Yu
33
-}
34 31
 \seealso{
35 32
 \link[ggplot2]{geom_point}
36 33
 }
37
-
34
+\author{
35
+Guangchuang Yu
36
+}
... ...
@@ -20,4 +20,3 @@ bar of range (HPD, range etc) to present uncertainty of evolutionary inference
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -31,4 +31,3 @@ add root point
31 31
 \author{
32 32
 Guangchuang Yu
33 33
 }
34
-
... ...
@@ -33,10 +33,9 @@ add segment layer
33 33
 \description{
34 34
 geom_segment2 support aes(subset) via setup_data
35 35
 }
36
-\author{
37
-Guangchuang Yu
38
-}
39 36
 \seealso{
40 37
 \link[ggplot2]{geom_segment}
41 38
 }
42
-
39
+\author{
40
+Guangchuang Yu
41
+}
... ...
@@ -51,4 +51,3 @@ annotate associated taxa (from taxa1 to taxa2, can be Monophyletic, Polyphyletic
51 51
 \author{
52 52
 Guangchuang Yu
53 53
 }
54
-
... ...
@@ -26,4 +26,3 @@ link between taxa
26 26
 \author{
27 27
 Guangchuang Yu
28 28
 }
29
-
... ...
@@ -40,10 +40,9 @@ text layer
40 40
 \description{
41 41
 geom_text2 support aes(subset) via setup_data
42 42
 }
43
-\author{
44
-Guangchuang Yu
45
-}
46 43
 \seealso{
47 44
 \link[ggplot2]{geom_text}
48 45
 }
49
-
46
+\author{
47
+Guangchuang Yu
48
+}
... ...
@@ -38,4 +38,3 @@ ggtree(tr) + geom_tiplab()
38 38
 \author{
39 39
 Yu Guangchuang
40 40
 }
41
-
... ...
@@ -19,10 +19,9 @@ tip label layer
19 19
 \description{
20 20
 add tip label for circular layout
21 21
 }
22
-\author{
23
-Guangchuang Yu
24
-}
25 22
 \references{
26 23
 \url{https://groups.google.com/forum/#!topic/bioc-ggtree/o35PV3iHO-0}
27 24
 }
28
-
25
+\author{
26
+Guangchuang Yu
27
+}
... ...
@@ -31,4 +31,3 @@ add tip point
31 31
 \author{
32 32
 Guangchuang Yu
33 33
 }
34
-
... ...
@@ -27,4 +27,3 @@ add tree layer
27 27
 \author{
28 28
 Yu Guangchuang
29 29
 }
30
-
... ...
@@ -20,4 +20,3 @@ add tree layer
20 20
 \author{
21 21
 Yu Guangchuang
22 22
 }
23
-
... ...
@@ -33,4 +33,3 @@ add tree scale
33 33
 \author{
34 34
 Guangchuang Yu
35 35
 }
36
-
... ...
@@ -20,4 +20,3 @@ extract offspring tips
20 20
 \author{
21 21
 ygc
22 22
 }
23
-
... ...
@@ -22,4 +22,3 @@ path from start node to end node
22 22
 \author{
23 23
 Guangchuang Yu
24 24
 }
25
-
... ...
@@ -24,4 +24,3 @@ download phylopic and convert to grob object
24 24
 \author{
25 25
 Guangchuang Yu
26 26
 }
27
-
... ...
@@ -17,4 +17,3 @@ list of child node ids of parent
17 17
 \description{
18 18
 Get list of child node id numbers of parent node
19 19
 }
20
-
... ...
@@ -19,4 +19,3 @@ angle in range [-1, 1], i.e. degrees/180, radians/pi
19 19
 \description{
20 20
 Get the angle between the two nodes specified.
21 21
 }
22
-
... ...
@@ -15,4 +15,3 @@ list of node id's in breadth-first order.
15 15
 \description{
16 16
 Get the nodes of tree from root in breadth-first order.
17 17
 }
18
-
... ...
@@ -17,4 +17,3 @@ integer node id of parent
17 17
 \description{
18 18
 Get parent node id of child node.
19 19
 }
20
-
... ...
@@ -17,4 +17,3 @@ list of all child node id's from starting node.
17 17
 \description{
18 18
 Get all children of node from tree, including start_node.
19 19
 }
20
-
... ...
@@ -18,4 +18,3 @@ named list of subtrees with the root id of subtree and list of node id's making
18 18
 Get all subtrees of node, as well as remaining branches of parent (ie, rest of tree structure as subtree)
19 19
 return named list of subtrees with list name as starting node id.
20 20
 }
21
-
... ...
@@ -20,4 +20,3 @@ named list with right and left angles in range [0,2] i.e 1 = 180 degrees, 1.5 =
20 20
 Find the right (clockwise rotation, angle from +ve x-axis to furthest subtree nodes) and
21 21
 left (anti-clockwise angle from +ve x-axis to subtree)
22 22
 }
23
-
... ...
@@ -22,4 +22,3 @@ get position of balance (xmin, xmax, ymin, ymax)
22 22
 \author{
23 23
 Justin Silverman
24 24
 }
25
-
... ...
@@ -20,4 +20,3 @@ get position of clade (xmin, xmax, ymin, ymax)
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -21,4 +21,3 @@ for labeling column names of heatmap produced by `gheatmap` function
21 21
 \author{
22 22
 Guangchuang Yu
23 23
 }
24
-
... ...
@@ -20,4 +20,3 @@ get taxa name of a selected node (or tree if node=NULL) sorted by their position
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -11,4 +11,3 @@ StatBalance
11 11
 StatHilight
12 12
 }
13 13
 \keyword{datasets}
14
-
... ...
@@ -3,8 +3,9 @@
3 3
 \docType{package}
4 4
 \name{ggtree}
5 5
 \alias{ggtree}
6
-\alias{ggtree-package}
7 6
 \alias{package-ggtree}
7
+\alias{ggtree-package}
8
+\alias{ggtree}
8 9
 \title{visualizing phylogenetic tree and heterogenous associated data based on grammar of graphics
9 10
 \code{ggtree} provides functions for visualizing phylogenetic tree and its associated data in R.}
10 11
 \usage{
... ...
@@ -57,4 +58,3 @@ ggtree(tr)
57 58
 \author{
58 59
 Yu Guangchuang
59 60
 }
60
-
... ...
@@ -49,4 +49,3 @@ append a heatmap of a matrix to right side of phylogenetic tree
49 49
 \author{
50 50
 Guangchuang Yu
51 51
 }
52
-
... ...
@@ -18,4 +18,3 @@
18 18
 \description{
19 19
 groupClade method for ggtree object
20 20
 }
21
-
... ...
@@ -20,4 +20,3 @@
20 20
 \description{
21 21
 groupOTU method for ggtree object
22 22
 }
23
-
... ...
@@ -3,12 +3,13 @@
3 3
 \docType{methods}
4 4
 \name{gzoom}
5 5
 \alias{gzoom}
6
+\alias{gzoom}
7
+\alias{gzoom,ggtree-method}
6 8
 \alias{gzoom,beast-method}
7 9
 \alias{gzoom,codeml-method}
8
-\alias{gzoom,ggtree-method}
10
+\alias{gzoom,treedata-method}
9 11
 \alias{gzoom,paml_rst-method}
10 12
 \alias{gzoom,phylo-method}
11
-\alias{gzoom,treedata-method}
12 13
 \title{gzoom method}
13 14
 \usage{
14 15
 gzoom(object, focus, subtree = FALSE, widths = c(0.3, 0.7), ...)
... ...
@@ -50,4 +51,3 @@ figure
50 51
 \description{
51 52
 zoom selected subtree
52 53
 }
53
-
... ...
@@ -29,4 +29,3 @@ gzoom(chiroptera, grep("Plecotus", chiroptera$tip.label))
29 29
 \author{
30 30
 ygc
31 31
 }
32
-
... ...
@@ -20,4 +20,3 @@ identify node by interactive click
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -35,4 +35,3 @@ add insets in a tree
35 35
 \author{
36 36
 Guangchuang Yu
37 37
 }
38
-
... ...
@@ -31,4 +31,3 @@ nodes = remove tip nodes.
31 31
 
32 32
 ```
33 33
 }
34
-
... ...
@@ -20,4 +20,3 @@ tree as data.frame with equal angle layout.
20 20
 \references{
21 21
 "Inferring Phylogenies" by Joseph Felsenstein.
22 22
 }
23
-
... ...
@@ -28,4 +28,3 @@ multiple sequence alignment with phylogenetic tree
28 28
 \author{
29 29
 Guangchuang Yu
30 30
 }
31
-
... ...
@@ -29,4 +29,3 @@ plot multiple ggplot objects in one page
29 29
 \author{
30 30
 Guangchuang Yu
31 31
 }
32
-
... ...
@@ -26,4 +26,3 @@ generate a list of bar charts for results of ancestral state reconstruction
26 26
 \author{
27 27
 Guangchuang Yu
28 28
 }
29
-
... ...
@@ -20,4 +20,3 @@ convert tip or node label(s) to internal node number
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -24,4 +24,3 @@ generate a list of pie charts for results of ancestral stat reconstruction
24 24
 \author{
25 25
 Guangchuang Yu
26 26
 }
27
-
... ...
@@ -20,4 +20,3 @@ open tree with specific angle
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -35,4 +35,3 @@ add phylopic layer
35 35
 \author{
36 36
 Guangchuang Yu
37 37
 }
38
-
... ...
@@ -17,4 +17,3 @@ pipe
17 17
 \seealso{
18 18
 \link[magrittr]{pipe}
19 19
 }
20
-
... ...
@@ -20,4 +20,3 @@ print information of a list of beast trees
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -26,4 +26,3 @@ tree object
26 26
 \description{
27 27
 reroot a tree
28 28
 }
29
-
... ...
@@ -20,4 +20,3 @@ rescale branch length of tree object
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -18,4 +18,3 @@ reverse timescle x-axis
18 18
 \author{
19 19
 guangchuang yu
20 20
 }
21
-
... ...
@@ -20,4 +20,3 @@ remove singleton
20 20
 \author{
21 21
 Guangchuang Yu \url{http://ygc.name}
22 22
 }
23
-
... ...
@@ -20,4 +20,3 @@ rotate 180 degree of a selected branch
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -21,4 +21,3 @@ updated tree data.frame with points rotated by angle
21 21
 \description{
22 22
 Rotate the points in a tree data.frame around a pivot node by the angle specified.
23 23
 }
24
-
... ...
@@ -20,4 +20,3 @@ rotate circular tree
20 20
 \author{
21 21
 Guangchuang Yu
22 22
 }
23
-
... ...
@@ -26,4 +26,3 @@ scale clade
26 26
 \author{
27 27
 Guangchuang Yu
28 28
 }
29
-
... ...
@@ -4,9 +4,9 @@
4 4
 \name{scale_color}
5 5
 \alias{scale_color}
6 6
 \alias{scale_color,beast-method}
7
+\alias{scale_color,treedata-method}
7 8
 \alias{scale_color,paml_rst-method}
8 9
 \alias{scale_color,phylo-method}
9
-\alias{scale_color,treedata-method}
10 10
 \title{scale_color method}
11 11
 \usage{
12 12
 scale_color(object, by, ...)
... ...
@@ -33,4 +33,3 @@ color vector
33 33
 \description{
34 34
 scale color by a numerical tree attribute
35 35
 }
36
-
... ...
@@ -22,4 +22,3 @@ scale x for tree with heatmap
22 22
 \author{
23 23
 Guangchuang Yu
24 24
 }
25
-
... ...
@@ -41,4 +41,3 @@ layer
41 41
 \description{
42 42
 stat_balance
43 43
 }
44
-
... ...
@@ -39,4 +39,3 @@ layer
39 39
 \description{
40 40
 stat_hilight
41 41
 }
42
-
... ...
@@ -28,4 +28,3 @@ add subview to mainview for ggplot2 objects
28 28
 \author{
29 29
 Guangchuang Yu
30 30
 }
31
-
... ...
@@ -21,4 +21,3 @@ theme for inset function
21 21
 \author{
22 22
 Guangchuang Yu
23 23
 }
24
-
... ...
@@ -18,4 +18,3 @@ transparent background theme
18 18
 \author{
19 19
 Guangchuang Yu
20 20
 }
21
-
... ...
@@ -27,4 +27,3 @@ ggtree(tr) + theme_tree()
27 27
 \author{
28 28
 Yu Guangchuang
29 29
 }
30
-
... ...
@@ -27,4 +27,3 @@ ggtree(tr) + theme_tree2()
27 27
 \author{
28 28
 Yu Guangchuang
29 29
 }
30
-
... ...
@@ -27,4 +27,3 @@ p \%<\% rtree(30)
27 27
 \author{
28 28
 Yu Guangchuang
29 29
 }
30
-
... ...
@@ -22,4 +22,3 @@ view a clade of tree
22 22
 \author{
23 23
 Guangchuang Yu
24 24
 }
25
-
... ...
@@ -20,4 +20,3 @@ expand x axis limits for specific panel
20 20
 \author{
21 21
 guangchuang yu
22 22
 }
23
-
... ...
@@ -18,4 +18,3 @@ set x axis limits for Tree panel
18 18
 \author{
19 19
 guangchuang yu
20 20
 }
21
-