| map_axis_labels {CellaRepertorium} | R Documentation |
Color axis labels
map_axis_labels( plt, label_data_x = NULL, label_data_y = NULL, aes_label, scale = ggplot2::scale_color_hue(aesthetics = "axis_color") )
plt |
|
label_data_x |
|
label_data_y |
|
aes_label |
character or bare symbol giving the column in |
scale |
|
plt with axis text modified
require(ggplot2)
require(dplyr)
plt = ggplot(mpg, aes(x = manufacturer, y = drv)) + geom_jitter()
label_data = mpg %>% select(manufacturer) %>% unique() %>%
mutate(euro = manufacturer %in% c('audi', 'volkswagen'))
map_axis_labels(plt, label_data_x = label_data, aes_label = euro)