1 | 1 |
deleted file mode 100644 |
... | ... |
@@ -1,235 +0,0 @@ |
1 |
-## ##' read jplace file |
|
2 |
-## ##' |
|
3 |
-## ##' |
|
4 |
-## ##' @title read.jplace |
|
5 |
-## ##' @param file jplace file |
|
6 |
-## ##' @return \code{jplace} instance |
|
7 |
-## ##' @importFrom jsonlite fromJSON |
|
8 |
-## ##' @export |
|
9 |
-## ##' @author ygc |
|
10 |
-## ##' @examples |
|
11 |
-## ##' jp <- system.file("extdata", "sample.jplace", package="ggtree") |
|
12 |
-## ##' read.jplace(jp) |
|
13 |
-## read.jplace <- function(file) { |
|
14 |
-## fields <- tree <- placements <- NULL |
|
15 |
-## version <- metadata <- NULL |
|
16 |
-## with(fromJSON(file), |
|
17 |
-## new("jplace", |
|
18 |
-## fields = fields, |
|
19 |
-## treetext = tree, |
|
20 |
-## phylo = jplace_treetext_to_phylo(tree), |
|
21 |
-## placements = placements, |
|
22 |
-## version = version, |
|
23 |
-## metadata = metadata, |
|
24 |
-## file = filename(file) |
|
25 |
-## ) |
|
26 |
-## ) |
|
27 |
-## } |
|
28 |
- |
|
29 |
- |
|
30 |
- |
|
31 |
-## ##' @rdname scale_color-methods |
|
32 |
-## ##' @exportMethod scale_color |
|
33 |
-## setMethod("scale_color", signature(object="jplace"), |
|
34 |
-## function(object, by, ...) { |
|
35 |
-## scale_color_(object, by, ...) |
|
36 |
-## }) |
|
37 |
- |
|
38 |
- |
|
39 |
- |
|
40 |
- |
|
41 |
-## ##' get.treeinfo method |
|
42 |
-## ##' |
|
43 |
-## ##' |
|
44 |
-## ##' @docType methods |
|
45 |
-## ##' @name get.treeinfo |
|
46 |
-## ##' @rdname get.treeinfo-methods |
|
47 |
-## ##' @aliases get.treeinfo,jplace,ANY-method |
|
48 |
-## ##' @exportMethod get.treeinfo |
|
49 |
-## ##' @author Guangchuang Yu \url{http://ygc.name} |
|
50 |
-## ##' @usage get.treeinfo(object, layout, ladderize, right, ...) |
|
51 |
-## ##' @examples |
|
52 |
-## ##' jp <- system.file("extdata", "sample.jplace", package="ggtree") |
|
53 |
-## ##' jp <- read.jplace(jp) |
|
54 |
-## ##' get.treeinfo(jp) |
|
55 |
-## setMethod("get.treeinfo", signature(object = "jplace"), |
|
56 |
-## function(object, layout="phylogram", |
|
57 |
-## ladderize=TRUE, right=FALSE, ...) { |
|
58 |
-## get.treeinfo.jplace(object, layout, |
|
59 |
-## ladderize, right, ...) |
|
60 |
-## } |
|
61 |
-## ) |
|
62 |
- |
|
63 |
- |
|
64 |
-## ##' get.treetext method |
|
65 |
-## ##' |
|
66 |
-## ##' |
|
67 |
-## ##' @docType methods |
|
68 |
-## ##' @name get.treetext |
|
69 |
-## ##' @rdname get.treetext-methods |
|
70 |
-## ##' @aliases get.treetext,jplace,ANY-method |
|
71 |
-## ##' @exportMethod get.treetext |
|
72 |
-## ##' @author Guangchuang Yu \url{http://ygc.name} |
|
73 |
-## ##' @usage get.treetext(object, ...) |
|
74 |
-## ##' @examples |
|
75 |
-## ##' jp <- system.file("extdata", "sample.jplace", package="ggtree") |
|
76 |
-## ##' jp <- read.jplace(jp) |
|
77 |
-## ##' get.treetext(jp) |
|
78 |
-## setMethod("get.treetext", signature(object = "jplace"), |
|
79 |
-## function(object, ...) { |
|
80 |
-## get.treetext.jplace(object, ...) |
|
81 |
-## } |
|
82 |
-## ) |
|
83 |
- |
|
84 |
- |
|
85 |
-## ##' get.fields method |
|
86 |
-## ##' |
|
87 |
-## ##' |
|
88 |
-## ##' @docType methods |
|
89 |
-## ##' @name get.fields |
|
90 |
-## ##' @rdname get.fields-methods |
|
91 |
-## ##' @aliases get.fields,jplace,ANY-method |
|
92 |
-## ##' @exportMethod get.fields |
|
93 |
-## ##' @author Guangchuang Yu \url{http://ygc.name} |
|
94 |
-## ##' @usage get.fields(object, ...) |
|
95 |
-## ##' @examples |
|
96 |
-## ##' jp <- system.file("extdata", "sample.jplace", package="ggtree") |
|
97 |
-## ##' jp <- read.jplace(jp) |
|
98 |
-## ##' get.fields(jp) |
|
99 |
-## setMethod("get.fields", signature(object = "jplace"), |
|
100 |
-## function(object, ...) { |
|
101 |
-## get.fields.tree(object) |
|
102 |
-## } |
|
103 |
-## ) |
|
104 |
- |
|
105 |
-## ##' get.placement method |
|
106 |
-## ##' |
|
107 |
-## ##' |
|
108 |
-## ##' @docType methods |
|
109 |
-## ##' @name get.placements |
|
110 |
-## ##' @rdname get.placements-methods |
|
111 |
-## ##' @aliases get.placements,jplace,ANY-method |
|
112 |
-## ##' @exportMethod get.placements |
|
113 |
-## ##' @author Guangchuang Yu \url{http://ygc.name} |
|
114 |
-## ##' @usage get.placements(object, by, ...) |
|
115 |
-## ##' @examples |
|
116 |
-## ##' jp <- system.file("extdata", "sample.jplace", package="ggtree") |
|
117 |
-## ##' jp <- read.jplace(jp) |
|
118 |
-## ##' get.placements(jp, by="all") |
|
119 |
-## setMethod("get.placements", signature(object = "jplace"), |
|
120 |
-## function(object, by="best", ...) { |
|
121 |
- |
|
122 |
-## placements <- object@placements |
|
123 |
-## place <- placements[,1] |
|
124 |
- |
|
125 |
-## ids <- NULL |
|
126 |
-## if (length(placements) == 2) { |
|
127 |
-## ids <- sapply(placements[,2], function(x) x[1]) |
|
128 |
-## names(place) <- ids |
|
129 |
-## } |
|
130 |
-## if (by == "best") { ## best hit |
|
131 |
-## place <- lapply(place, function(x) { |
|
132 |
-## if (is(x, "data.frame") || is(x, "matrix")) { |
|
133 |
-## if (nrow(x) == 1) { |
|
134 |
-## return(x) |
|
135 |
-## } |
|
136 |
-## ## http://astrostatistics.psu.edu/su07/R/html/base/html/all.equal.html |
|
137 |
-## ## due to precision, number are identical maynot be equal, so use all.equal which can test nearly equal number |
|
138 |
-## ## if not equals, the output is a descript string of the differences |
|
139 |
-## idx <- sapply(2:nrow(x), function(i) all.equal(x[1,2], x[i,2])) |
|
140 |
-## if (any(idx == TRUE)) { |
|
141 |
-## return(x[c(1, which(idx==TRUE)+1),]) |
|
142 |
-## } else { |
|
143 |
-## return(x[1,]) |
|
144 |
-## } |
|
145 |
- |
|
146 |
-## } else { |
|
147 |
-## ## if only 1 row, it may stored as vector |
|
148 |
-## ## the edge number, for example 523 can be 523.0000 due to R stored number as real number |
|
149 |
-## ## be careful in mapping edge number. |
|
150 |
-## return(x) |
|
151 |
-## } |
|
152 |
-## }) |
|
153 |
- |
|
154 |
-## } |
|
155 |
- |
|
156 |
-## place.df <- do.call("rbind", place) |
|
157 |
-## row.names(place.df) <- NULL |
|
158 |
-## if (!is.null(ids)) { |
|
159 |
-## nn <- rep(ids, sapply(place, function(x) { |
|
160 |
-## nr <- nrow(x) |
|
161 |
-## if (is.null(nr)) |
|
162 |
-## return(1) |
|
163 |
-## return(nr) |
|
164 |
-## })) |
|
165 |
-## place.df <- data.frame(name=nn, place.df) |
|
166 |
-## colnames(place.df) <- c("name", object@fields) |
|
167 |
-## } else { |
|
168 |
-## colnames(place.df) <- object@fields |
|
169 |
-## } |
|
170 |
-## res <- as.data.frame(place.df, stringsAsFactor=FALSE) |
|
171 |
- |
|
172 |
-## ## res[] <- lapply(res, as.character) |
|
173 |
-## ## for (i in 1:ncol(res)) { |
|
174 |
-## ## if (all(grepl("^[0-9\\.e]+$", res[,i]))) { |
|
175 |
-## ## res[,i] <- as.numeric(res[,i]) |
|
176 |
-## ## } |
|
177 |
-## ## } |
|
178 |
-## return(res) |
|
179 |
-## }) |
|
180 |
- |
|
181 |
- |
|
182 |
-## get.treetext.jplace <- function(object, ...) { |
|
183 |
-## object@treetext |
|
184 |
-## } |
|
185 |
- |
|
186 |
-## get.fields.jplace <- function(object, ...) { |
|
187 |
-## object@fields |
|
188 |
-## } |
|
189 |
- |
|
190 |
-## get.treeinfo.jplace <- function(object, layout, |
|
191 |
-## ladderize, right, ...) { |
|
192 |
-## extract.treeinfo.jplace(object, layout, |
|
193 |
-## ladderize, right, ...) |
|
194 |
-## } |
|
195 |
- |
|
196 |
-## ##' generate jplace file |
|
197 |
-## ##' |
|
198 |
-## ##' |
|
199 |
-## ##' @title write.jplace |
|
200 |
-## ##' @param nwk tree in newick format |
|
201 |
-## ##' @param data annotation data |
|
202 |
-## ##' @param outfile jplace output file |
|
203 |
-## ##' @return jplace file |
|
204 |
-## ##' @export |
|
205 |
-## ##' @author ygc |
|
206 |
-## ##' @examples |
|
207 |
-## ##' tree <- system.file("extdata", "pa.nwk", package="ggtree") |
|
208 |
-## ##' data <- read.csv(system.file("extdata", "pa_subs.csv", package="ggtree"), |
|
209 |
-## ##' stringsAsFactor=FALSE) |
|
210 |
-## ##' outfile <- tempfile() |
|
211 |
-## ##' write.jplace(tree, data, outfile) |
|
212 |
-## write.jplace <- function(nwk, data, outfile) { |
|
213 |
-## out <- file(outfile, "w") |
|
214 |
-## data[] = lapply(data, as.character) ## remove factor |
|
215 |
-## writeLines("{", out) |
|
216 |
-## writeLines(paste0('\t"tree": "', readLines(nwk), '",'), out) |
|
217 |
-## writeLines('\t"placements": [', out) |
|
218 |
-## for (i in 1:nrow(data)) { |
|
219 |
-## writeLines(paste0('\t{"p":["', paste(data[i,], collapse = '", "'), '"]}'), out, sep="") |
|
220 |
-## if (i != nrow(data)) { |
|
221 |
-## writeLines(',', out) |
|
222 |
-## } |
|
223 |
-## } |
|
224 |
-## writeLines('],', out) |
|
225 |
-## writeLines('\t"metadata": {"info": "generated by ggtree package"},', |
|
226 |
-## out) |
|
227 |
-## writeLines('\t"version": 2,', out) |
|
228 |
-## writeLines(paste0('\t"fields": [', '"', |
|
229 |
-## paste(colnames(data), collapse='", "'), |
|
230 |
-## '"'), |
|
231 |
-## out) |
|
232 |
-## writeLines('\t]\n}', out) |
|
233 |
-## close(out) |
|
234 |
-## } |
|
235 |
- |
... | ... |
@@ -4,9 +4,9 @@ ggtree: an R package for visualization and annotation of phylogenetic trees with |
4 | 4 |
|
5 | 5 |
<img src="https://raw.githubusercontent.com/Bioconductor/BiocStickers/master/ggtree/ggtree.png" height="200" align="right" /> |
6 | 6 |
|
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) |
|
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 |
|
... | ... |
@@ -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 |
-[](http://dx.doi.org/10.1111/2041-210X.12628) [](https://www.altmetric.com/details/10533079) [](https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627) |
|
30 |
+[](http://dx.doi.org/10.1111/2041-210X.12628) [](https://www.altmetric.com/details/10533079) [](https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627) |
|
31 | 31 |
|
32 | 32 |
------------------------------------------------------------------------ |
33 | 33 |
|
... | ... |
@@ -384,6 +384,8 @@ |
384 | 384 |
<li><a href="https://guangchuangyu.github.io/2015/02/ggtree---updating-a-tree-view/">ggtree - updating a tree view</a></li> |
385 | 385 |
<li><a href="https://guangchuangyu.github.io/2015/04/an-example-of-drawing-beast-tree-using-ggtree">an example of drawing beast tree using ggtree</a></li> |
386 | 386 |
<li><a href="http://www.molecularecologist.com/2017/02/phylogenetic-trees-in-r-using-ggtree/">Phylogenetic trees in R using ggtree</a> <i class="fa fa-arrow-left"></i> The Molecular Ecologist</li> |
387 |
+<li><a href="https://phe-bioinformatics.github.io/blog/2017/06/14/ggtree_exploration">Growing a ggtree</a></li> |
|
388 |
+<li><a href="https://phe-bioinformatics.github.io/blog/2017/07/07/ggtree_part2">Growing a ggtree - part 2, adding tip shapes</a></li> |
|
387 | 389 |
</ul> |
388 | 390 |
</div> |
389 | 391 |
<div id="tree-annotation" class="section level3"> |
... | ... |
@@ -398,6 +400,7 @@ |
398 | 400 |
<li><a href="https://guangchuangyu.github.io/2016/06/identify-method-for-ggtree">identify method for ggtree</a></li> |
399 | 401 |
<li><a href="https://guangchuangyu.github.io/2016/10/facet_plot-a-general-solution-to-associate-data-with-phylogenetic-tree/">facet_plot: a general solution to associate data with phylogenetic tree</a></li> |
400 | 402 |
<li><a href="https://guangchuangyu.github.io/2016/11/align-genomic-features-with-phylogenetic-tree/">align genomic features with phylogenetic tree</a></li> |
403 |
+<li><a href="https://stackoverflow.com/questions/45384281/ggjoy-facet-with-ggtree">ggjoy facet with ggtree</a></li> |
|
401 | 404 |
<li><a href="https://guangchuangyu.github.io/2016/10/xlim_tree-set-x-axis-limits-for-only-tree-panel/">xlim_tree: set x axis limits for only Tree panel</a></li> |
402 | 405 |
<li><a href="https://guangchuangyu.github.io/2016/12/add-layer-to-specific-panel-of-facet_plot-output/">add layer to specific panel of facet_plot output</a></li> |
403 | 406 |
</ul> |
... | ... |
@@ -44,6 +44,8 @@ weight: 10 |
44 | 44 |
+ [ggtree - updating a tree view](https://guangchuangyu.github.io/2015/02/ggtree---updating-a-tree-view/) |
45 | 45 |
+ [an example of drawing beast tree using ggtree](https://guangchuangyu.github.io/2015/04/an-example-of-drawing-beast-tree-using-ggtree) |
46 | 46 |
+ [Phylogenetic trees in R using ggtree](http://www.molecularecologist.com/2017/02/phylogenetic-trees-in-r-using-ggtree/) <i class="fa fa-arrow-left"></i> The Molecular Ecologist |
47 |
++ [Growing a ggtree](https://phe-bioinformatics.github.io/blog/2017/06/14/ggtree_exploration) |
|
48 |
++ [Growing a ggtree - part 2, adding tip shapes](https://phe-bioinformatics.github.io/blog/2017/07/07/ggtree_part2) |
|
47 | 49 |
|
48 | 50 |
### <i class="fa fa-angle-double-right"></i> Tree annotation |
49 | 51 |
|
... | ... |
@@ -56,6 +58,7 @@ weight: 10 |
56 | 58 |
+ [identify method for ggtree](https://guangchuangyu.github.io/2016/06/identify-method-for-ggtree) |
57 | 59 |
+ [facet_plot: a general solution to associate data with phylogenetic tree](https://guangchuangyu.github.io/2016/10/facet_plot-a-general-solution-to-associate-data-with-phylogenetic-tree/) |
58 | 60 |
+ [align genomic features with phylogenetic tree](https://guangchuangyu.github.io/2016/11/align-genomic-features-with-phylogenetic-tree/) |
61 |
++ [ggjoy facet with ggtree](https://stackoverflow.com/questions/45384281/ggjoy-facet-with-ggtree) |
|
59 | 62 |
+ [xlim_tree: set x axis limits for only Tree panel](https://guangchuangyu.github.io/2016/10/xlim_tree-set-x-axis-limits-for-only-tree-panel/) |
60 | 63 |
+ [add layer to specific panel of facet_plot output](https://guangchuangyu.github.io/2016/12/add-layer-to-specific-panel-of-facet_plot-output/) |
61 | 64 |
|
... | ... |
@@ -18,7 +18,7 @@ |
18 | 18 |
<pubDate>Mon, 24 Jul 2017 00:11:02 +0100</pubDate> |
19 | 19 |
|
20 | 20 |
<guid>https://guangchuangyu.github.io/ggtree/documentation/</guid> |
21 |
- <description> Vignettes ggtree Tree Data Import Tree Visualization Tree Annotation Tree Manipulation Advance Tree Annotation ggtree utilities Phylomoji Blog posts News and updates viewing and annotating phylogenetic tree with ggtree ggtree in Bioconductor 3.1 BioC 3.1: NEWS of my BioC packages BioC 3.2: NEWS of my BioC packages News of ggtree BioC 3.3: NEWS of my BioC packages BioC 3.4: NEWS of my BioC packages ggtree paper published Data manipulation subsetting data in ggtree ggtree supports phylip tree format convert graphic object to tree object using treeio Tree visualization ggtree - updating a tree view an example of drawing beast tree using ggtree Phylogenetic trees in R using ggtree The Molecular Ecologist Tree annotation label edge number in ggtree Edge coloring with user data subview Annotate a phylogenetic tree with insets ggtree annotate phylogenetic tree with local images embed images in ggplot2 via subview and annotate a phylogenetic tree with images using inset function identify method for ggtree facet_plot: a general solution to associate data with phylogenetic tree align genomic features with phylogenetic tree xlim_tree: set x axis limits for only Tree panel add layer to specific panel of facet_plot output Tree manipulation flip and rotate branches in ggtree Application ggtree for microbiome data ggtree for outbreak data ggtree version of plotTree reproducible logo generated by ggtree Funny stuff ggtree with funny fonts comic phylogenetic tree with ggtree and comicR use emoji font in R Slides Generating publication quality figures using R &amp; ggplot2 ggtree for visualization and annotation of phylogenetic trees Video interactive clade highlighting interactive rotating clades interactive clade labeling Workflow recreate a tree from a publication (Bloom et al, Science 2010) </description> |
|
21 |
+ <description> Vignettes ggtree Tree Data Import Tree Visualization Tree Annotation Tree Manipulation Advance Tree Annotation ggtree utilities Phylomoji Blog posts News and updates viewing and annotating phylogenetic tree with ggtree ggtree in Bioconductor 3.1 BioC 3.1: NEWS of my BioC packages BioC 3.2: NEWS of my BioC packages News of ggtree BioC 3.3: NEWS of my BioC packages BioC 3.4: NEWS of my BioC packages ggtree paper published Data manipulation subsetting data in ggtree ggtree supports phylip tree format convert graphic object to tree object using treeio Tree visualization ggtree - updating a tree view an example of drawing beast tree using ggtree Phylogenetic trees in R using ggtree The Molecular Ecologist Growing a ggtree Growing a ggtree - part 2, adding tip shapes Tree annotation label edge number in ggtree Edge coloring with user data subview Annotate a phylogenetic tree with insets ggtree annotate phylogenetic tree with local images embed images in ggplot2 via subview and annotate a phylogenetic tree with images using inset function identify method for ggtree facet_plot: a general solution to associate data with phylogenetic tree align genomic features with phylogenetic tree ggjoy facet with ggtree xlim_tree: set x axis limits for only Tree panel add layer to specific panel of facet_plot output Tree manipulation flip and rotate branches in ggtree Application ggtree for microbiome data ggtree for outbreak data ggtree version of plotTree reproducible logo generated by ggtree Funny stuff ggtree with funny fonts comic phylogenetic tree with ggtree and comicR use emoji font in R Slides Generating publication quality figures using R &amp; ggplot2 ggtree for visualization and annotation of phylogenetic trees Video interactive clade highlighting interactive rotating clades interactive clade labeling Workflow recreate a tree from a publication (Bloom et al, Science 2010) </description> |
|
22 | 22 |
</item> |
23 | 23 |
|
24 | 24 |
</channel> |
... | ... |
@@ -344,7 +344,7 @@ |
344 | 344 |
|
345 | 345 |
<p><link rel="stylesheet" href="https://guangchuangyu.github.io/css/font-awesome.min.css"> <link rel="stylesheet" href="https://guangchuangyu.github.io/css/academicons.min.css"></p> |
346 | 346 |
<p><img src="https://raw.githubusercontent.com/Bioconductor/BiocStickers/master/ggtree/ggtree.png" height="200" align="right" /></p> |
347 |
-<p><a href="https://bioconductor.org/packages/ggtree"><img src="https://img.shields.io/badge/release%20version-1.8.1-blue.svg?style=flat" /></a> <a href="https://github.com/guangchuangyu/ggtree"><img src="https://img.shields.io/badge/devel%20version-1.9.2-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-17269/total-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-885/month-blue.svg?style=flat" /></a></p> |
|
347 |
+<p><a href="https://bioconductor.org/packages/ggtree"><img src="https://img.shields.io/badge/release%20version-1.8.1-blue.svg?style=flat" /></a> <a href="https://github.com/guangchuangyu/ggtree"><img src="https://img.shields.io/badge/devel%20version-1.9.3-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-17269/total-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-885/month-blue.svg?style=flat" /></a></p> |
|
348 | 348 |
<p>The <code>ggtree</code> package extending the <em>ggplot2</em> package. It based on grammar of graphics and takes all the good parts of <em>ggplot2</em>. <em>ggtree</em> is designed for not only viewing phylogenetic tree but also displaying annotation data on the tree. <em>ggtree</em> is released within the <a href="https://bioconductor.org/packages/ggtree/">Bioconductor</a> project and the source code is hosted on <a href="https://github.com/GuangchuangYu/ggtree"><i class="fa fa-github fa-lg"></i> GitHub</a>.</p> |
349 | 349 |
<div id="authors" class="section level2"> |
350 | 350 |
<h2><i class="fa fa-user"></i> Authors</h2> |
... | ... |
@@ -353,7 +353,7 @@ |
353 | 353 |
<div id="citation" class="section level2"> |
354 | 354 |
<h2><i class="fa fa-book"></i> Citation</h2> |
355 | 355 |
<p>Please cite the following article when using <code>ggtree</code>:</p> |
356 |
-<p><a href="http://dx.doi.org/10.1111/2041-210X.12628"><img src="https://img.shields.io/badge/doi-10.1111/2041--210X.12628-blue.svg?style=flat" /></a> <a href="https://www.altmetric.com/details/10533079"><img src="https://img.shields.io/badge/Altmetric-351-blue.svg?style=flat" /></a> <a href="https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627"><img src="https://img.shields.io/badge/cited%20by-29-blue.svg?style=flat" alt="citation" /></a></p> |
|
356 |
+<p><a href="http://dx.doi.org/10.1111/2041-210X.12628"><img src="https://img.shields.io/badge/doi-10.1111/2041--210X.12628-blue.svg?style=flat" /></a> <a href="https://www.altmetric.com/details/10533079"><img src="https://img.shields.io/badge/Altmetric-349-blue.svg?style=flat" /></a> <a href="https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627"><img src="https://img.shields.io/badge/cited%20by-29-blue.svg?style=flat" alt="citation" /></a></p> |
|
357 | 357 |
<p><strong>G Yu</strong>, 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. <strong><em>Methods in Ecology and Evolution</em></strong>. 2017, 8(1):28-36.</p> |
358 | 358 |
</div> |
359 | 359 |
<div id="featured-articles" class="section level2"> |
... | ... |
@@ -28,7 +28,7 @@ |
28 | 28 |
<pubDate>Mon, 24 Jul 2017 00:11:02 +0100</pubDate> |
29 | 29 |
|
30 | 30 |
<guid>https://guangchuangyu.github.io/ggtree/documentation/</guid> |
31 |
- <description> Vignettes ggtree Tree Data Import Tree Visualization Tree Annotation Tree Manipulation Advance Tree Annotation ggtree utilities Phylomoji Blog posts News and updates viewing and annotating phylogenetic tree with ggtree ggtree in Bioconductor 3.1 BioC 3.1: NEWS of my BioC packages BioC 3.2: NEWS of my BioC packages News of ggtree BioC 3.3: NEWS of my BioC packages BioC 3.4: NEWS of my BioC packages ggtree paper published Data manipulation subsetting data in ggtree ggtree supports phylip tree format convert graphic object to tree object using treeio Tree visualization ggtree - updating a tree view an example of drawing beast tree using ggtree Phylogenetic trees in R using ggtree The Molecular Ecologist Tree annotation label edge number in ggtree Edge coloring with user data subview Annotate a phylogenetic tree with insets ggtree annotate phylogenetic tree with local images embed images in ggplot2 via subview and annotate a phylogenetic tree with images using inset function identify method for ggtree facet_plot: a general solution to associate data with phylogenetic tree align genomic features with phylogenetic tree xlim_tree: set x axis limits for only Tree panel add layer to specific panel of facet_plot output Tree manipulation flip and rotate branches in ggtree Application ggtree for microbiome data ggtree for outbreak data ggtree version of plotTree reproducible logo generated by ggtree Funny stuff ggtree with funny fonts comic phylogenetic tree with ggtree and comicR use emoji font in R Slides Generating publication quality figures using R &amp; ggplot2 ggtree for visualization and annotation of phylogenetic trees Video interactive clade highlighting interactive rotating clades interactive clade labeling Workflow recreate a tree from a publication (Bloom et al, Science 2010) </description> |
|
31 |
+ <description> Vignettes ggtree Tree Data Import Tree Visualization Tree Annotation Tree Manipulation Advance Tree Annotation ggtree utilities Phylomoji Blog posts News and updates viewing and annotating phylogenetic tree with ggtree ggtree in Bioconductor 3.1 BioC 3.1: NEWS of my BioC packages BioC 3.2: NEWS of my BioC packages News of ggtree BioC 3.3: NEWS of my BioC packages BioC 3.4: NEWS of my BioC packages ggtree paper published Data manipulation subsetting data in ggtree ggtree supports phylip tree format convert graphic object to tree object using treeio Tree visualization ggtree - updating a tree view an example of drawing beast tree using ggtree Phylogenetic trees in R using ggtree The Molecular Ecologist Growing a ggtree Growing a ggtree - part 2, adding tip shapes Tree annotation label edge number in ggtree Edge coloring with user data subview Annotate a phylogenetic tree with insets ggtree annotate phylogenetic tree with local images embed images in ggplot2 via subview and annotate a phylogenetic tree with images using inset function identify method for ggtree facet_plot: a general solution to associate data with phylogenetic tree align genomic features with phylogenetic tree ggjoy facet with ggtree xlim_tree: set x axis limits for only Tree panel add layer to specific panel of facet_plot output Tree manipulation flip and rotate branches in ggtree Application ggtree for microbiome data ggtree for outbreak data ggtree version of plotTree reproducible logo generated by ggtree Funny stuff ggtree with funny fonts comic phylogenetic tree with ggtree and comicR use emoji font in R Slides Generating publication quality figures using R &amp; ggplot2 ggtree for visualization and annotation of phylogenetic trees Video interactive clade highlighting interactive rotating clades interactive clade labeling Workflow recreate a tree from a publication (Bloom et al, Science 2010) </description> |
|
32 | 32 |
</item> |
33 | 33 |
|
34 | 34 |
<item> |
... | ... |
@@ -76,9 +76,9 @@ http://dx.doi.org/10.1111/2041-210X.12628 |
76 | 76 |
|
77 | 77 |
<guid>https://guangchuangyu.github.io/ggtree/tweets/</guid> |
78 | 78 |
<description>Leave me a message on |
79 |
-Second post with an update on how to add tip shapes and colours to ggtree https://t.co/ezWF4TVQst |
|
80 |
-&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 Yes and no. No manual assignment =&gt; randomly assigned colours. Even with manual spec ggtree is still much quicker than making fig by hand 😀 |
|
81 |
-&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 I&#39;d use ggtree from Bioconductor as you can really tailor all the fonts etc.</description> |
|
79 |
+Possible to combine #ggjoy with #ggtree ? My gg-fu is weak. #rstats #DataViz #JoyPlot https://t.co/4FICfER6Oa |
|
80 |
+&mdash; Libby Megna (@LibbyMegna) July 29, 2017 Second post with an update on how to add tip shapes and colours to ggtree https://t.co/ezWF4TVQst |
|
81 |
+&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 Yes and no. No manual assignment =&gt; randomly assigned colours. Even with manual spec ggtree is still much quicker than making fig by hand 😀</description> |
|
82 | 82 |
</item> |
83 | 83 |
|
84 | 84 |
</channel> |
... | ... |
@@ -343,7 +343,8 @@ |
343 | 343 |
|
344 | 344 |
<p><link rel="stylesheet" href="https://guangchuangyu.github.io/css/font-awesome.min.css"></p> |
345 | 345 |
<p><font size="4"><strong>Leave me a message on <a href="https://twitter.com/hashtag/ggtree"><i class="fa fa-twitter fa-lg"></i></a></strong></font></p> |
346 |
-<p><blockquote class="twitter-tweet"><p lang="en" dir="ltr">Second post with an update on how to add tip shapes and colours to ggtree <a href="https://t.co/ezWF4TVQst">https://t.co/ezWF4TVQst</a></p>— Anthony Underwood (@bioinformAnt) <a href="https://twitter.com/bioinformAnt/status/883301626022375424">July 7, 2017</a></blockquote> |
|
346 |
+<p><blockquote class="twitter-tweet"><p lang="en" dir="ltr">Possible to combine <a href="https://twitter.com/hashtag/ggjoy?src=hash">#ggjoy</a> with <a href="https://twitter.com/hashtag/ggtree?src=hash">#ggtree</a> ? My gg-fu is weak. <a href="https://twitter.com/hashtag/rstats?src=hash">#rstats</a> <a href="https://twitter.com/hashtag/DataViz?src=hash">#DataViz</a> <a href="https://twitter.com/hashtag/JoyPlot?src=hash">#JoyPlot</a> <a href="https://t.co/4FICfER6Oa">https://t.co/4FICfER6Oa</a></p>— Libby Megna (@LibbyMegna) <a href="https://twitter.com/LibbyMegna/status/891144389715783680">July 29, 2017</a></blockquote> |
|
347 |
+<script async src="//platform.twitter.com/widgets.js" charset="utf-8"></script><blockquote class="twitter-tweet"><p lang="en" dir="ltr">Second post with an update on how to add tip shapes and colours to ggtree <a href="https://t.co/ezWF4TVQst">https://t.co/ezWF4TVQst</a></p>— Anthony Underwood (@bioinformAnt) <a href="https://twitter.com/bioinformAnt/status/883301626022375424">July 7, 2017</a></blockquote> |
|
347 | 348 |
<script async src="//platform.twitter.com/widgets.js" charset="utf-8"></script><blockquote class="twitter-tweet"><p lang="en" dir="ltr">Yes and no. No manual assignment => randomly assigned colours. Even with manual spec ggtree is still much quicker than making fig by hand 😀</p>— Anthony Underwood (@bioinformAnt) <a href="https://twitter.com/bioinformAnt/status/883246854695256064">July 7, 2017</a></blockquote> |
348 | 349 |
<script async src="//platform.twitter.com/widgets.js" charset="utf-8"></script><blockquote class="twitter-tweet"><p lang="en" dir="ltr">I'd use ggtree from Bioconductor as you can really tailor all the fonts etc..<a href="https://t.co/NAcbFswGYB">https://t.co/NAcbFswGYB</a></p>— Susan Holmes (@SherlockpHolmes) <a href="https://twitter.com/SherlockpHolmes/status/877576023109390336">June 21, 2017</a></blockquote> |
349 | 350 |
<script async src="//platform.twitter.com/widgets.js" charset="utf-8"></script><blockquote class="twitter-tweet"><p lang="en" dir="ltr">How phylogenies and associated heatmaps can be drawn using the <a href="https://twitter.com/hashtag/ggtree?src=hash">#ggtree</a> package in <a href="https://twitter.com/hashtag/R?src=hash">#R</a> <a href="https://t.co/rlBvGxUEBO">https://t.co/rlBvGxUEBO</a></p>— L. Rosaleny (@lorelai66) <a href="https://twitter.com/lorelai66/status/875594411584782337">June 16, 2017</a></blockquote> |
... | ... |
@@ -19,9 +19,9 @@ |
19 | 19 |
|
20 | 20 |
<guid>https://guangchuangyu.github.io/ggtree/tweets/</guid> |
21 | 21 |
<description>Leave me a message on |
22 |
-Second post with an update on how to add tip shapes and colours to ggtree https://t.co/ezWF4TVQst |
|
23 |
-&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 Yes and no. No manual assignment =&gt; randomly assigned colours. Even with manual spec ggtree is still much quicker than making fig by hand 😀 |
|
24 |
-&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 I&#39;d use ggtree from Bioconductor as you can really tailor all the fonts etc.</description> |
|
22 |
+Possible to combine #ggjoy with #ggtree ? My gg-fu is weak. #rstats #DataViz #JoyPlot https://t.co/4FICfER6Oa |
|
23 |
+&mdash; Libby Megna (@LibbyMegna) July 29, 2017 Second post with an update on how to add tip shapes and colours to ggtree https://t.co/ezWF4TVQst |
|
24 |
+&mdash; Anthony Underwood (@bioinformAnt) July 7, 2017 Yes and no. No manual assignment =&gt; randomly assigned colours. Even with manual spec ggtree is still much quicker than making fig by hand 😀</description> |
|
25 | 25 |
</item> |
26 | 26 |
|
27 | 27 |
</channel> |
... | ... |
@@ -49,6 +49,8 @@ weight: 10 |
49 | 49 |
<li><a href="https://guangchuangyu.github.io/2015/02/ggtree---updating-a-tree-view/">ggtree - updating a tree view</a></li> |
50 | 50 |
<li><a href="https://guangchuangyu.github.io/2015/04/an-example-of-drawing-beast-tree-using-ggtree">an example of drawing beast tree using ggtree</a></li> |
51 | 51 |
<li><a href="http://www.molecularecologist.com/2017/02/phylogenetic-trees-in-r-using-ggtree/">Phylogenetic trees in R using ggtree</a> <i class="fa fa-arrow-left"></i> The Molecular Ecologist</li> |
52 |
+<li><a href="https://phe-bioinformatics.github.io/blog/2017/06/14/ggtree_exploration">Growing a ggtree</a></li> |
|
53 |
+<li><a href="https://phe-bioinformatics.github.io/blog/2017/07/07/ggtree_part2">Growing a ggtree - part 2, adding tip shapes</a></li> |
|
52 | 54 |
</ul> |
53 | 55 |
</div> |
54 | 56 |
<div id="tree-annotation" class="section level3"> |
... | ... |
@@ -63,6 +65,7 @@ weight: 10 |
63 | 65 |
<li><a href="https://guangchuangyu.github.io/2016/06/identify-method-for-ggtree">identify method for ggtree</a></li> |
64 | 66 |
<li><a href="https://guangchuangyu.github.io/2016/10/facet_plot-a-general-solution-to-associate-data-with-phylogenetic-tree/">facet_plot: a general solution to associate data with phylogenetic tree</a></li> |
65 | 67 |
<li><a href="https://guangchuangyu.github.io/2016/11/align-genomic-features-with-phylogenetic-tree/">align genomic features with phylogenetic tree</a></li> |
68 |
+<li><a href="https://stackoverflow.com/questions/45384281/ggjoy-facet-with-ggtree">ggjoy facet with ggtree</a></li> |
|
66 | 69 |
<li><a href="https://guangchuangyu.github.io/2016/10/xlim_tree-set-x-axis-limits-for-only-tree-panel/">xlim_tree: set x axis limits for only Tree panel</a></li> |
67 | 70 |
<li><a href="https://guangchuangyu.github.io/2016/12/add-layer-to-specific-panel-of-facet_plot-output/">add layer to specific panel of facet_plot output</a></li> |
68 | 71 |
</ul> |
... | ... |
@@ -44,6 +44,8 @@ weight: 10 |
44 | 44 |
+ [ggtree - updating a tree view](https://guangchuangyu.github.io/2015/02/ggtree---updating-a-tree-view/) |
45 | 45 |
+ [an example of drawing beast tree using ggtree](https://guangchuangyu.github.io/2015/04/an-example-of-drawing-beast-tree-using-ggtree) |
46 | 46 |
+ [Phylogenetic trees in R using ggtree](http://www.molecularecologist.com/2017/02/phylogenetic-trees-in-r-using-ggtree/) <i class="fa fa-arrow-left"></i> The Molecular Ecologist |
47 |
++ [Growing a ggtree](https://phe-bioinformatics.github.io/blog/2017/06/14/ggtree_exploration) |
|
48 |
++ [Growing a ggtree - part 2, adding tip shapes](https://phe-bioinformatics.github.io/blog/2017/07/07/ggtree_part2) |
|
47 | 49 |
|
48 | 50 |
### <i class="fa fa-angle-double-right"></i> Tree annotation |
49 | 51 |
|
... | ... |
@@ -56,6 +58,7 @@ weight: 10 |
56 | 58 |
+ [identify method for ggtree](https://guangchuangyu.github.io/2016/06/identify-method-for-ggtree) |
57 | 59 |
+ [facet_plot: a general solution to associate data with phylogenetic tree](https://guangchuangyu.github.io/2016/10/facet_plot-a-general-solution-to-associate-data-with-phylogenetic-tree/) |
58 | 60 |
+ [align genomic features with phylogenetic tree](https://guangchuangyu.github.io/2016/11/align-genomic-features-with-phylogenetic-tree/) |
61 |
++ [ggjoy facet with ggtree](https://stackoverflow.com/questions/45384281/ggjoy-facet-with-ggtree) |
|
59 | 62 |
+ [xlim_tree: set x axis limits for only Tree panel](https://guangchuangyu.github.io/2016/10/xlim_tree-set-x-axis-limits-for-only-tree-panel/) |
60 | 63 |
+ [add layer to specific panel of facet_plot output](https://guangchuangyu.github.io/2016/12/add-layer-to-specific-panel-of-facet_plot-output/) |
61 | 64 |
|
... | ... |
@@ -9,7 +9,7 @@ weight: 1 |
9 | 9 |
|
10 | 10 |
<p><link rel="stylesheet" href="https://guangchuangyu.github.io/css/font-awesome.min.css"> <link rel="stylesheet" href="https://guangchuangyu.github.io/css/academicons.min.css"></p> |
11 | 11 |
<p><img src="https://raw.githubusercontent.com/Bioconductor/BiocStickers/master/ggtree/ggtree.png" height="200" align="right" /></p> |
12 |
-<p><a href="https://bioconductor.org/packages/ggtree"><img src="https://img.shields.io/badge/release%20version-1.8.1-blue.svg?style=flat" /></a> <a href="https://github.com/guangchuangyu/ggtree"><img src="https://img.shields.io/badge/devel%20version-1.9.2-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-17269/total-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-885/month-blue.svg?style=flat" /></a></p> |
|
12 |
+<p><a href="https://bioconductor.org/packages/ggtree"><img src="https://img.shields.io/badge/release%20version-1.8.1-blue.svg?style=flat" /></a> <a href="https://github.com/guangchuangyu/ggtree"><img src="https://img.shields.io/badge/devel%20version-1.9.3-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-17269/total-blue.svg?style=flat" /></a> <a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img src="https://img.shields.io/badge/download-885/month-blue.svg?style=flat" /></a></p> |
|
13 | 13 |
<p>The <code>ggtree</code> package extending the <em>ggplot2</em> package. It based on grammar of graphics and takes all the good parts of <em>ggplot2</em>. <em>ggtree</em> is designed for not only viewing phylogenetic tree but also displaying annotation data on the tree. <em>ggtree</em> is released within the <a href="https://bioconductor.org/packages/ggtree/">Bioconductor</a> project and the source code is hosted on <a href="https://github.com/GuangchuangYu/ggtree"><i class="fa fa-github fa-lg"></i> GitHub</a>.</p> |
14 | 14 |
<div id="authors" class="section level2"> |
15 | 15 |
<h2><i class="fa fa-user"></i> Authors</h2> |
... | ... |
@@ -18,7 +18,7 @@ weight: 1 |
18 | 18 |
<div id="citation" class="section level2"> |
19 | 19 |
<h2><i class="fa fa-book"></i> Citation</h2> |
20 | 20 |
<p>Please cite the following article when using <code>ggtree</code>:</p> |
21 |
-<p><a href="http://dx.doi.org/10.1111/2041-210X.12628"><img src="https://img.shields.io/badge/doi-10.1111/2041--210X.12628-blue.svg?style=flat" /></a> <a href="https://www.altmetric.com/details/10533079"><img src="https://img.shields.io/badge/Altmetric-351-blue.svg?style=flat" /></a> <a href="https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627"><img src="https://img.shields.io/badge/cited%20by-29-blue.svg?style=flat" alt="citation" /></a></p> |
|
21 |
+<p><a href="http://dx.doi.org/10.1111/2041-210X.12628"><img src="https://img.shields.io/badge/doi-10.1111/2041--210X.12628-blue.svg?style=flat" /></a> <a href="https://www.altmetric.com/details/10533079"><img src="https://img.shields.io/badge/Altmetric-349-blue.svg?style=flat" /></a> <a href="https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627"><img src="https://img.shields.io/badge/cited%20by-29-blue.svg?style=flat" alt="citation" /></a></p> |
|
22 | 22 |
<p><strong>G Yu</strong>, 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. <strong><em>Methods in Ecology and Evolution</em></strong>. 2017, 8(1):28-36.</p> |
23 | 23 |
</div> |
24 | 24 |
<div id="featured-articles" class="section level2"> |
... | ... |
@@ -8,4 +8,4 @@ weight: 50 |
8 | 8 |
|
9 | 9 |
<p><link rel="stylesheet" href="https://guangchuangyu.github.io/css/font-awesome.min.css"></p> |
10 | 10 |
<p><font size="4"><strong>Leave me a message on <a href="https://twitter.com/hashtag/ggtree"><i class="fa fa-twitter fa-lg"></i></a></strong></font></p> |
11 |
-<p>{{% tweet 883301626022375424 %}}{{% tweet 883246854695256064 %}}{{% tweet 877576023109390336 %}}{{% tweet 875594411584782337 %}}{{% tweet 871775262152810496 %}}{{% tweet 867408666852511744 %}}{{% tweet 857665638600507393 %}}{{% tweet 840181267542994944 %}}{{% tweet 839831849736232962 %}}{{% tweet 830023569887391744 %}}{{% tweet 829398997735313408 %}}{{% tweet 824264788456984576 %}}{{% tweet 822383911258890242 %}}{{% tweet 811666431452450816 %}}{{% tweet 811661275889549312 %}}{{% tweet 797041236867686400 %}}{{% tweet 797037016403820546 %}}{{% tweet 794278716859879424 %}}{{% tweet 831952966701678592 %}}{{% tweet 788751417746059264 %}}{{% tweet 693123105707986944 %}}{{% tweet 691762302492790788 %}}{{% tweet 687933344219312128 %}}{{% tweet 684411780412526592 %}}{{% tweet 665188011047563268 %}}{{% tweet 664040586001915904 %}}{{% tweet 639507420054749184 %}}{{% tweet 671673570259509248 %}}{{% tweet 667490462693912576 %}}{{% tweet 660278158663401473 %}}{{% tweet 641251456595685376 %}}{{% tweet 559734740488818688 %}}{{% tweet 559762891478667264 %}}{{% tweet 561514846291001344 %}}{{% tweet 559542705663905793 %}}{{% tweet 561056244782227456 %}}{{% tweet 664085841766195200 %}}{{% tweet 664431087683260416 %}}{{% tweet 667706456045694976 %}}{{% tweet 663937183791759360 %}}{{% tweet 663771499589861376 %}}{{% tweet 667433534756397057 %}}{{% tweet 640573716733169664 %}}{{% tweet 664407764001779712 %}}{{% tweet 630500659960254464 %}}{{% tweet 547497335412899840 %}}{{% tweet 610364467939913728 %}}</p> |
|
11 |
+<p>{{% tweet 891144389715783680 %}}{{% tweet 883301626022375424 %}}{{% tweet 883246854695256064 %}}{{% tweet 877576023109390336 %}}{{% tweet 875594411584782337 %}}{{% tweet 871775262152810496 %}}{{% tweet 867408666852511744 %}}{{% tweet 857665638600507393 %}}{{% tweet 840181267542994944 %}}{{% tweet 839831849736232962 %}}{{% tweet 830023569887391744 %}}{{% tweet 829398997735313408 %}}{{% tweet 824264788456984576 %}}{{% tweet 822383911258890242 %}}{{% tweet 811666431452450816 %}}{{% tweet 811661275889549312 %}}{{% tweet 797041236867686400 %}}{{% tweet 797037016403820546 %}}{{% tweet 794278716859879424 %}}{{% tweet 831952966701678592 %}}{{% tweet 788751417746059264 %}}{{% tweet 693123105707986944 %}}{{% tweet 691762302492790788 %}}{{% tweet 687933344219312128 %}}{{% tweet 684411780412526592 %}}{{% tweet 665188011047563268 %}}{{% tweet 664040586001915904 %}}{{% tweet 639507420054749184 %}}{{% tweet 671673570259509248 %}}{{% tweet 667490462693912576 %}}{{% tweet 660278158663401473 %}}{{% tweet 641251456595685376 %}}{{% tweet 559734740488818688 %}}{{% tweet 559762891478667264 %}}{{% tweet 561514846291001344 %}}{{% tweet 559542705663905793 %}}{{% tweet 561056244782227456 %}}{{% tweet 664085841766195200 %}}{{% tweet 664431087683260416 %}}{{% tweet 667706456045694976 %}}{{% tweet 663937183791759360 %}}{{% tweet 663771499589861376 %}}{{% tweet 667433534756397057 %}}{{% tweet 640573716733169664 %}}{{% tweet 664407764001779712 %}}{{% tweet 630500659960254464 %}}{{% tweet 547497335412899840 %}}{{% tweet 610364467939913728 %}}</p> |