... | ... |
@@ -1,6 +1,6 @@ |
1 | 1 |
##' append a heatmap of a matrix to right side of phylogenetic tree |
2 | 2 |
##' |
3 |
-##' |
|
3 |
+##' |
|
4 | 4 |
##' @title gheatmap |
5 | 5 |
##' @param p tree view |
6 | 6 |
##' @param data matrix or data.frame |
... | ... |
@@ -31,23 +31,23 @@ |
31 | 31 |
gheatmap <- function(p, data, offset=0, width=1, low="green", high="red", color="white", |
32 | 32 |
colnames=TRUE, colnames_position="bottom", colnames_angle=0, colnames_level=NULL, |
33 | 33 |
colnames_offset_x = 0, colnames_offset_y = 0, font.size=4, hjust=0.5) { |
34 |
- |
|
34 |
+ |
|
35 | 35 |
colnames_position %<>% match.arg(c("bottom", "top")) |
36 | 36 |
variable <- value <- lab <- y <- NULL |
37 |
- |
|
37 |
+ |
|
38 | 38 |
## if (is.null(width)) { |
39 | 39 |
## width <- (p$data$x %>% range %>% diff)/30 |
40 | 40 |
## } |
41 |
- |
|
41 |
+ |
|
42 | 42 |
## convert width to width of each cell |
43 | 43 |
width <- width * (p$data$x %>% range %>% diff) / ncol(data) |
44 |
- |
|
44 |
+ |
|
45 | 45 |
isTip <- x <- y <- variable <- value <- from <- to <- NULL |
46 |
- |
|
46 |
+ |
|
47 | 47 |
df <- p$data |
48 | 48 |
df <- df[df$isTip,] |
49 | 49 |
start <- max(df$x) + offset |
50 |
- |
|
50 |
+ |
|
51 | 51 |
dd <- as.data.frame(data) |
52 | 52 |
## dd$lab <- rownames(dd) |
53 | 53 |
lab <- df$label[order(df$y)] |
... | ... |
@@ -69,10 +69,10 @@ gheatmap <- function(p, data, offset=0, width=1, low="green", high="red", color= |
69 | 69 |
V2 <- start + as.numeric(dd$variable) * width |
70 | 70 |
mapping <- data.frame(from=dd$variable, to=V2) |
71 | 71 |
mapping <- unique(mapping) |
72 |
- |
|
72 |
+ |
|
73 | 73 |
dd$x <- V2 |
74 | 74 |
dd$width <- width |
75 |
- |
|
75 |
+ |
|
76 | 76 |
if (is.null(color)) { |
77 | 77 |
p2 <- p + geom_tile(data=dd, aes(x, y, fill=value), width=width, inherit.aes=FALSE) |
78 | 78 |
} else { |
... | ... |
@@ -83,7 +83,7 @@ gheatmap <- function(p, data, offset=0, width=1, low="green", high="red", color= |
83 | 83 |
} else { |
84 | 84 |
p2 <- p2 + scale_fill_discrete(na.value=NA) #"white") |
85 | 85 |
} |
86 |
- |
|
86 |
+ |
|
87 | 87 |
if (colnames) { |
88 | 88 |
if (colnames_position == "bottom") { |
89 | 89 |
y <- 0 |
... | ... |
@@ -94,10 +94,10 @@ gheatmap <- function(p, data, offset=0, width=1, low="green", high="red", color= |
94 | 94 |
p2 <- p2 + geom_text(data=mapping, aes(x=to, y = y, label=from), size=font.size, inherit.aes = FALSE, |
95 | 95 |
angle=colnames_angle, nudge_x=colnames_offset_x, nudge_y = colnames_offset_y, hjust=hjust) |
96 | 96 |
} |
97 |
- |
|
97 |
+ |
|
98 | 98 |
p2 <- p2 + theme(legend.position="right", legend.title=element_blank()) |
99 | 99 |
## p2 <- p2 + guides(fill = guide_legend(override.aes = list(colour = NULL))) |
100 |
- |
|
100 |
+ |
|
101 | 101 |
attr(p2, "mapping") <- mapping |
102 | 102 |
return(p2) |
103 | 103 |
} |
... | ... |
@@ -234,12 +234,12 @@ published using <code>ggtree</code> and your publication will be featured here.< |
234 | 234 |
height: 300px; |
235 | 235 |
}<br /> |
236 | 236 |
</style> |
237 |
-<div id="chart5f2d37e8c08a" class="rChart morris"></p> |
|
237 |
+<div id="chart11855a166b40" class="rChart morris"></p> |
|
238 | 238 |
</div> |
239 | 239 |
|
240 | 240 |
<script type='text/javascript'> |
241 | 241 |
var chartParams = { |
242 |
- "element": "chart5f2d37e8c08a", |
|
242 |
+ "element": "chart11855a166b40", |
|
243 | 243 |
"width": 800, |
244 | 244 |
"height": 400, |
245 | 245 |
"xkey": "year", |
... | ... |
@@ -258,7 +258,7 @@ published using <code>ggtree</code> and your publication will be featured here.< |
258 | 258 |
"pubid": "HtEfBTGE9r8C" |
259 | 259 |
} |
260 | 260 |
], |
261 |
-"id": "chart5f2d37e8c08a", |
|
261 |
+"id": "chart11855a166b40", |
|
262 | 262 |
"labels": "cites" |
263 | 263 |
}, |
264 | 264 |
chartType = "Bar" |
... | ... |
@@ -234,7 +234,7 @@ |
234 | 234 |
<link rel="stylesheet" href="https://guangchuangyu.github.io/css/academicons.min.css"></p> |
235 | 235 |
<p><a href="https://bioconductor.org/packages/ggtree"><img alt="" src="https://img.shields.io/badge/release%20version-1.8.1-blue.svg?style=flat" /></a> |
236 | 236 |
<a href="https://github.com/guangchuangyu/ggtree"><img alt="" src="https://img.shields.io/badge/devel%20version-1.9.1-blue.svg?style=flat" /></a> |
237 |
-<a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img alt="" src="https://img.shields.io/badge/download-16372/total-blue.svg?style=flat" /></a> |
|
237 |
+<a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img alt="" src="https://img.shields.io/badge/download-16674/total-blue.svg?style=flat" /></a> |
|
238 | 238 |
<a href="https://bioconductor.org/packages/stats/bioc/ggtree"><img alt="" src="https://img.shields.io/badge/download-1117/month-blue.svg?style=flat" /></a></p> |
239 | 239 |
<p>The <code>ggtree</code> package extending the <em>ggplot2</em> package. It based on |
240 | 240 |
grammar of graphics and takes all the good parts of <em>ggplot2</em>. <em>ggtree</em> |
... | ... |
@@ -256,7 +256,7 @@ University of Hong Kong.</p> |
256 | 256 |
<h2 id="citation"><i class="fa fa-book"></i> Citation</h2> |
257 | 257 |
<p>Please cite the following article when using <code>ggtree</code>:</p> |
258 | 258 |
<p><a href="http://dx.doi.org/10.1111/2041-210X.12628"><img alt="" src="https://img.shields.io/badge/doi-10.1111/2041--210X.12628-blue.svg?style=flat" /></a> |
259 |
-<a href="https://www.altmetric.com/details/10533079"><img alt="" src="https://img.shields.io/badge/Altmetric-346-blue.svg?style=flat" /></a> |
|
259 |
+<a href="https://www.altmetric.com/details/10533079"><img alt="" src="https://img.shields.io/badge/Altmetric-345-blue.svg?style=flat" /></a> |
|
260 | 260 |
<a href="https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627"><img alt="citation" src="https://img.shields.io/badge/cited%20by-22-blue.svg?style=flat" /></a></p> |
261 | 261 |
<p><strong>G Yu</strong>, DK Smith, H Zhu, Y Guan, TTY Lam<sup>*</sup>. ggtree: an R |
262 | 262 |
package for visualization and annotation of phylogenetic trees with |
... | ... |
@@ -217,7 +217,7 @@ |
217 | 217 |
}, |
218 | 218 |
{ |
219 | 219 |
"location": "/featuredArticles/", |
220 |
- "text": "Let us know\n if you have\npublished using \nggtree\n and your publication will be featured here.\n\n\n\n\n\n\n\n\n\n\n\n\n\n .rChart {\n display: block;\n margin-left: auto; \n margin-right: auto;\n width: 800px;\n height: 300px;\n }<br />\n \n\n\n\n\n\n\n\n\n var chartParams = {\n \"element\": \"chart5f2d37e8c08a\",\n\"width\": 800,\n\"height\": 400,\n\"xkey\": \"year\",\n\"ykeys\": [\n \"cites\" \n],\n\"data\": [\n {\n \"year\": 2016,\n\"cites\": 1,\n\"pubid\": \"HtEfBTGE9r8C\" \n},\n{\n \"year\": 2017,\n\"cites\": 21,\n\"pubid\": \"HtEfBTGE9r8C\" \n} \n],\n\"id\": \"chart5f2d37e8c08a\",\n\"labels\": \"cites\" \n},\n chartType = \"Bar\"\n new Morris[chartType](chartParams)\n\n\n\n\n\n\n\n\n\n\n 2017\n\n\nPhylogenetic analysis of the human antibody repertoire reveals\nquantitative signatures of immune senescence and\naging\n. \nPNAS\n, 2017\n\n\nHorses in Denmark Are a Reservoir of Diverse Clones of\nMethicillin-Resistant and -Susceptible Staphylococcus\naureus\n.\n\nFrontiers in Microbiology\n, 2017, 8:543\n\n\nGut metagenomes of type 2 diabetic patients have characteristic\nsingle-nucleotide polymorphism distribution in \nBacteroides\ncoprocola\n.\n\nMicrobiome\n, 2017, 5:15\n\n\n 2016\n\n\nFunction and Phylogeny of Bacterial Butyryl Coenzyme A:Acetate\nTransferases and Their Diversity in the Proximal Colon of\nSwine\n. \nApplied and\nEnvironmental Microbiology\n. 2016, 82(22):6788-6798.", |
|
220 |
+ "text": "Let us know\n if you have\npublished using \nggtree\n and your publication will be featured here.\n\n\n\n\n\n\n\n\n\n\n\n\n\n .rChart {\n display: block;\n margin-left: auto; \n margin-right: auto;\n width: 800px;\n height: 300px;\n }<br />\n \n\n\n\n\n\n\n\n\n var chartParams = {\n \"element\": \"chart11855a166b40\",\n\"width\": 800,\n\"height\": 400,\n\"xkey\": \"year\",\n\"ykeys\": [\n \"cites\" \n],\n\"data\": [\n {\n \"year\": 2016,\n\"cites\": 1,\n\"pubid\": \"HtEfBTGE9r8C\" \n},\n{\n \"year\": 2017,\n\"cites\": 21,\n\"pubid\": \"HtEfBTGE9r8C\" \n} \n],\n\"id\": \"chart11855a166b40\",\n\"labels\": \"cites\" \n},\n chartType = \"Bar\"\n new Morris[chartType](chartParams)\n\n\n\n\n\n\n\n\n\n\n 2017\n\n\nPhylogenetic analysis of the human antibody repertoire reveals\nquantitative signatures of immune senescence and\naging\n. \nPNAS\n, 2017\n\n\nHorses in Denmark Are a Reservoir of Diverse Clones of\nMethicillin-Resistant and -Susceptible Staphylococcus\naureus\n.\n\nFrontiers in Microbiology\n, 2017, 8:543\n\n\nGut metagenomes of type 2 diabetic patients have characteristic\nsingle-nucleotide polymorphism distribution in \nBacteroides\ncoprocola\n.\n\nMicrobiome\n, 2017, 5:15\n\n\n 2016\n\n\nFunction and Phylogeny of Bacterial Butyryl Coenzyme A:Acetate\nTransferases and Their Diversity in the Proximal Colon of\nSwine\n. \nApplied and\nEnvironmental Microbiology\n. 2016, 82(22):6788-6798.", |
|
221 | 221 |
"title": "Featured Articles" |
222 | 222 |
}, |
223 | 223 |
{ |
... | ... |
@@ -4,7 +4,7 @@ |
4 | 4 |
|
5 | 5 |
<url> |
6 | 6 |
<loc>https://guangchuangyu.github.io/ggtree/</loc> |
7 |
- <lastmod>2017-06-19</lastmod> |
|
7 |
+ <lastmod>2017-06-28</lastmod> |
|
8 | 8 |
<changefreq>daily</changefreq> |
9 | 9 |
</url> |
10 | 10 |
|
... | ... |
@@ -12,7 +12,7 @@ |
12 | 12 |
|
13 | 13 |
<url> |
14 | 14 |
<loc>https://guangchuangyu.github.io/ggtree/documentation/</loc> |
15 |
- <lastmod>2017-06-19</lastmod> |
|
15 |
+ <lastmod>2017-06-28</lastmod> |
|
16 | 16 |
<changefreq>daily</changefreq> |
17 | 17 |
</url> |
18 | 18 |
|
... | ... |
@@ -20,7 +20,7 @@ |
20 | 20 |
|
21 | 21 |
<url> |
22 | 22 |
<loc>https://guangchuangyu.github.io/ggtree/faq/</loc> |
23 |
- <lastmod>2017-06-19</lastmod> |
|
23 |
+ <lastmod>2017-06-28</lastmod> |
|
24 | 24 |
<changefreq>daily</changefreq> |
25 | 25 |
</url> |
26 | 26 |
|
... | ... |
@@ -28,7 +28,7 @@ |
28 | 28 |
|
29 | 29 |
<url> |
30 | 30 |
<loc>https://guangchuangyu.github.io/ggtree/featuredArticles/</loc> |
31 |
- <lastmod>2017-06-19</lastmod> |
|
31 |
+ <lastmod>2017-06-28</lastmod> |
|
32 | 32 |
<changefreq>daily</changefreq> |
33 | 33 |
</url> |
34 | 34 |
|
... | ... |
@@ -36,7 +36,7 @@ |
36 | 36 |
|
37 | 37 |
<url> |
38 | 38 |
<loc>https://guangchuangyu.github.io/ggtree/gallery/</loc> |
39 |
- <lastmod>2017-06-19</lastmod> |
|
39 |
+ <lastmod>2017-06-28</lastmod> |
|
40 | 40 |
<changefreq>daily</changefreq> |
41 | 41 |
</url> |
42 | 42 |
|
... | ... |
@@ -45,55 +45,55 @@ |
45 | 45 |
|
46 | 46 |
<url> |
47 | 47 |
<loc>https://guangchuangyu.github.io/ggtree/ChIPseeker/</loc> |
48 |
- <lastmod>2017-06-19</lastmod> |
|
48 |
+ <lastmod>2017-06-28</lastmod> |
|
49 | 49 |
<changefreq>daily</changefreq> |
50 | 50 |
</url> |
51 | 51 |
|
52 | 52 |
<url> |
53 | 53 |
<loc>https://guangchuangyu.github.io/ggtree/clusterProfiler/</loc> |
54 |
- <lastmod>2017-06-19</lastmod> |
|
54 |
+ <lastmod>2017-06-28</lastmod> |
|
55 | 55 |
<changefreq>daily</changefreq> |
56 | 56 |
</url> |
57 | 57 |
|
58 | 58 |
<url> |
59 | 59 |
<loc>https://guangchuangyu.github.io/ggtree/DOSE/</loc> |
60 |
- <lastmod>2017-06-19</lastmod> |
|
60 |
+ <lastmod>2017-06-28</lastmod> |
|
61 | 61 |
<changefreq>daily</changefreq> |
62 | 62 |
</url> |
63 | 63 |
|
64 | 64 |
<url> |
65 | 65 |
<loc>https://guangchuangyu.github.io/ggtree/emojifont/</loc> |
66 |
- <lastmod>2017-06-19</lastmod> |
|
66 |
+ <lastmod>2017-06-28</lastmod> |
|
67 | 67 |
<changefreq>daily</changefreq> |
68 | 68 |
</url> |
69 | 69 |
|
70 | 70 |
<url> |
71 | 71 |
<loc>https://guangchuangyu.github.io/ggtree/ggtree/</loc> |
72 |
- <lastmod>2017-06-19</lastmod> |
|
72 |
+ <lastmod>2017-06-28</lastmod> |
|
73 | 73 |
<changefreq>daily</changefreq> |
74 | 74 |
</url> |
75 | 75 |
|
76 | 76 |
<url> |
77 | 77 |
<loc>https://guangchuangyu.github.io/ggtree/GOSemSim/</loc> |
78 |
- <lastmod>2017-06-19</lastmod> |
|
78 |
+ <lastmod>2017-06-28</lastmod> |
|
79 | 79 |
<changefreq>daily</changefreq> |
80 | 80 |
</url> |
81 | 81 |
|
82 | 82 |
<url> |
83 | 83 |
<loc>https://guangchuangyu.github.io/ggtree/meshes/</loc> |
84 |
- <lastmod>2017-06-19</lastmod> |
|
84 |
+ <lastmod>2017-06-28</lastmod> |
|
85 | 85 |
<changefreq>daily</changefreq> |
86 | 86 |
</url> |
87 | 87 |
|
88 | 88 |
<url> |
89 | 89 |
<loc>https://guangchuangyu.github.io/ggtree/ReactomePA/</loc> |
90 |
- <lastmod>2017-06-19</lastmod> |
|
90 |
+ <lastmod>2017-06-28</lastmod> |
|
91 | 91 |
<changefreq>daily</changefreq> |
92 | 92 |
</url> |
93 | 93 |
|
94 | 94 |
<url> |
95 | 95 |
<loc>https://guangchuangyu.github.io/ggtree/treeio/</loc> |
96 |
- <lastmod>2017-06-19</lastmod> |
|
96 |
+ <lastmod>2017-06-28</lastmod> |
|
97 | 97 |
<changefreq>daily</changefreq> |
98 | 98 |
</url> |
99 | 99 |
|
... | ... |
@@ -39,13 +39,13 @@ published using `ggtree` and your publication will be featured here. |
39 | 39 |
height: 300px; |
40 | 40 |
} |
41 | 41 |
</style> |
42 |
-<div id="chart5f2d37e8c08a" class="rChart morris"> |
|
42 |
+<div id="chart11855a166b40" class="rChart morris"> |
|
43 | 43 |
|
44 | 44 |
</div> |
45 | 45 |
|
46 | 46 |
<script type='text/javascript'> |
47 | 47 |
var chartParams = { |
48 |
- "element": "chart5f2d37e8c08a", |
|
48 |
+ "element": "chart11855a166b40", |
|
49 | 49 |
"width": 800, |
50 | 50 |
"height": 400, |
51 | 51 |
"xkey": "year", |
... | ... |
@@ -64,7 +64,7 @@ published using `ggtree` and your publication will be featured here. |
64 | 64 |
"pubid": "HtEfBTGE9r8C" |
65 | 65 |
} |
66 | 66 |
], |
67 |
-"id": "chart5f2d37e8c08a", |
|
67 |
+"id": "chart11855a166b40", |
|
68 | 68 |
"labels": "cites" |
69 | 69 |
}, |
70 | 70 |
chartType = "Bar" |
... | ... |
@@ -29,7 +29,7 @@ ggtree: visualization and annotation of phylogenetic trees |
29 | 29 |
|
30 | 30 |
[](https://bioconductor.org/packages/ggtree) |
31 | 31 |
[](https://github.com/guangchuangyu/ggtree) |
32 |
-[](https://bioconductor.org/packages/stats/bioc/ggtree) |
|
32 |
+[](https://bioconductor.org/packages/stats/bioc/ggtree) |
|
33 | 33 |
[](https://bioconductor.org/packages/stats/bioc/ggtree) |
34 | 34 |
|
35 | 35 |
The `ggtree` package extending the *ggplot2* package. It based on |
... | ... |
@@ -60,7 +60,7 @@ University of Hong Kong. |
60 | 60 |
Please cite the following article when using `ggtree`: |
61 | 61 |
|
62 | 62 |
[](http://dx.doi.org/10.1111/2041-210X.12628) |
63 |
-[](https://www.altmetric.com/details/10533079) |
|
63 |
+[](https://www.altmetric.com/details/10533079) |
|
64 | 64 |
[](https://scholar.google.com.hk/scholar?oi=bibs&hl=en&cites=7268358477862164627) |
65 | 65 |
|
66 | 66 |
**G Yu**, DK Smith, H Zhu, Y Guan, TTY Lam<sup>\*</sup>. ggtree: an R |