Hi
Im new to R and hope to get help to change the colors to grey.
Fig2 <- d2 %>%
group_by(name, value) %>%
summarise(count = n()) %>%
mutate(perc = count/sum(count))
ggplot(Fig2, aes(x = factor(name), y = perc*100, fill = factor(value))) +
geom_bar(stat="identity", width = 0.7) +
labs(x = "Symptom", y = "Proportion (%)", fill = "value") +
theme_minimal(base_size = 14) +
scale_fill_discrete(labels = c('An extreme amount', 'A lot', 'A considerable amount',
'A moderate amount','A fair amount', 'Some', 'Very little', 'None' ))
Thank you
Regards