Change color for ggplot graph

Help needed:
Following code is used to create a polygon graph, it displays in white black one, is it possible to change the polygon to other color? Thank you!

input<- data.frame(ID=c(1,2,3,4,5,6,7,8,1,2,3,4,5,6,7,8),group=c('a','a','a','a','a','a','a','a','b','b','b','b','b','b','b','b'),
value=c(0.31,0.69,0.43,0.47,0.35,0.32,0.33,0.9,0.98,0.36,0.86,0.99,0.64,0.83,0.36,0.28),
counts=c(0.6,0.6,0.6,0.6,0.6,0.6,0.6,0.6,1.2,1.2,1.2,1.2,1.2,1.2,1.2,1.2))

library(dplyr)
library(ggplot2)
library(ggiraphExtra)
input %>%
ggplot(aes(ID, value)) +
geom_polygon() +
geom_text(aes(0,0, label = round(counts, 2)), color = "white") +
facet_grid(~group) +
scale_y_continuous("", limits = c(0, 1), expand = c(0,0)) +
scale_x_continuous("", breaks = 1:8, expand = c(0,0)) +
theme_minimal() +
coord_radar()

Yes, you can set the fill colour as an argument, see:
http://www.cookbook-r.com/Graphs/Colors_(ggplot2)/

3 Likes

Thank you so much!!!

1 Like