Поиск…


Вступление

В этом разделе мы рассмотрим, как настроить оси, заголовки и легенды, используя библиотеку ggplot2 .

Изменить название легенды и увеличить количество ключей

# load the library
library(ggplot2)

# create a blank canvas
g <- ggplot(data = diamonds)

g + geom_bar(aes(x = cut, fill = cut)) + 
    scale_fill_discrete(guide = guide_legend(title = "CUT", 
                                             keywidth = 2, 
                                             keyheight = 2))

введите описание изображения здесь

Сравните частоты между группами и удалите заголовок легенды

g + geom_bar(aes(x = cut, fill = color), position = "fill") + 
    guides(fill = guide_legend(title = NULL))

введите описание изображения здесь

Поместите перекрывающиеся объекты рядом друг с другом и измените цвета текстов осей

g + geom_bar(mapping = aes(x = cut, fill = clarity), position = "dodge") +
    theme(axis.text = element_text(colour = "red", size = 12))

введите описание изображения здесь

Точная настройка осей тиков, текстов и названий

 g + geom_histogram(aes(price, fill = cut), binwidth = 500) + 
    labs(x = "Price", y = "Number of diamonds", 
         title = "Distribution of prices \n across Cuts") + 
    theme(plot.title = element_text(colour = "red", face = "italic"),
        axis.title.x = element_text(face="bold", 
                                      colour="darkgreen", size = 12),
      axis.text.x  = element_text(angle = 45, vjust = 0.5, size = 12), 
      axis.title.y = element_text(face="bold", 
                                  colour="darkblue", size = 12),
      axis.text.y  = element_text(size = 12, colour = "brown"))

введите описание изображения здесь



Modified text is an extract of the original Stack Overflow Documentation
Лицензировано согласно CC BY-SA 3.0
Не связан с Stack Overflow