Select top100
reserve_tip<-group$OTU.ID
to_drop<-tree$tip.label[-match(reserve_tip,tree$tip.label)]
tree_reduced<-treeio::drop.tip(tree,to_drop)
Plot the tree!
mycolors = c("#1B9E77", "royalblue1", "#7570B3", "#E7298A", "#66A61E", "#E6AB02", "#A6761D", "#666666", "palevioletred2", "paleturquoise2", "#D95F02", "black")
a = ggtree(tree, size = 0.75, alpha = 0.8, branch.length = 'none', aes(color = group) ) + geom_tiplab(size=2.4) + geom_nodepoint(color="orange", alpha=0.8, size=1) + geom_tippoint(aes(color = group) , size = 1, alpha = 0.8) + scale_color_manual(values = mycolors )
a

# circular型
ggtree(tree, size = 0.75, alpha = 0.8, layout = "circular", branch.length = 'none', aes(color = group) ) + geom_tiplab(size=2.4) + geom_nodepoint(color="orange", alpha=0.8, size=1) + geom_tippoint(aes(color = group) , size = 1, alpha = 0.8) + scale_color_manual(values = mycolors )

Add something!
# 准备热图
heat = data.frame(group)
heat = heat[,-15]
heat = heat[,-15]
heat1 = heat
rownames(heat1) = heat1[,1]
heat1 = heat1[,-1]
colnames(heat1) = c("SW", "M 7", "PC 7", "PET 7", "PP 7", "M 14", "PC 14", "PET 14", "PP 14", "M 21", "PC 21", "PET 21", "PP 21")
library(viridis)
## Loading required package: viridisLite
gheatmap(a, heat1, width = 1.8) + scale_fill_viridis(option="magma", direction = -1)
## Scale for 'fill' is already present. Adding another scale for 'fill', which
## will replace the existing scale.
