mytriangle {FELLA} | R Documentation |
This function enables the usage of triangles as shape in
the function plot.igraph
.
mytriangle(coords, v = NULL, params)
coords, v, params |
clipping arguments, see
|
Plot symbols
## This function is internal library(igraph) add.vertex.shape( "triangle", clip = shapes("circle")$clip, plot = FELLA:::mytriangle) g <- barabasi.game(10) plot( g, vertex.shape = "triangle", vertex.color = rainbow(vcount(g)), vertex.size = seq(10, 20, length = vcount(g)))