ggplot2

Install

# The easiest way to get ggplot2 is to install the whole tidyverse:
#install.packages("tidyverse")

# Alternatively, install just ggplot2:
#install.packages("ggplot2")

# Or the development version from GitHub:
# install.packages("devtools")
#devtools::install_github("tidyverse/ggplot2")
# The easiest way to get ggplot2 is to install the whole tidyverse:
install.packages("tidyverse")

# Alternatively, install just ggplot2:
install.packages("ggplot2")

# Or the development version from GitHub:
# install.packages("devtools")
#devtools::install_github("tidyverse/ggplot2")
data(mtcars)
head(mtcars)
                   mpg cyl disp  hp drat    wt  qsec vs am gear carb
Mazda RX4         21.0   6  160 110 3.90 2.620 16.46  0  1    4    4
Mazda RX4 Wag     21.0   6  160 110 3.90 2.875 17.02  0  1    4    4
Datsun 710        22.8   4  108  93 3.85 2.320 18.61  1  1    4    1
Hornet 4 Drive    21.4   6  258 110 3.08 3.215 19.44  1  0    3    1
Hornet Sportabout 18.7   8  360 175 3.15 3.440 17.02  0  0    3    2
Valiant           18.1   6  225 105 2.76 3.460 20.22  1  0    3    1
library(ggplot2)
g <- ggplot()
plot(g)

g <- ggplot() +
  geom_histogram()
plot(g)

# do not run
g <- ggplot() +
  geom_histogram(data = mtcars)
plot(g)
g <- ggplot() +
  geom_histogram(data = mtcars,
                 mapping = aes(x=mpg))
plot(g)
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

g <- ggplot() +
  geom_histogram(data = mtcars,
                 mapping = aes(x=wt))
plot(g)
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

g <- ggplot() +
  geom_histogram(data = mtcars,
                 mapping = aes(y=wt))
plot(g)
`stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

g <- ggplot() +
  geom_point(data = mtcars,
             mapping = aes(x=mpg, y=wt))
plot(g)

g <- ggplot() +
  geom_line(data = mtcars,
             mapping = aes(x=mpg, y=wt))
plot(g)

g <- ggplot() +
  geom_point(data = mtcars,mapping = aes(x=mpg, y=wt)) +
  geom_line(data = mtcars,mapping = aes(x=mpg, y=wt))
plot(g)

g <- ggplot(data = mtcars,mapping = aes(x=mpg, y=wt)) +
  geom_point() +
  geom_line()
plot(g)

g <- ggplot(data = mtcars,mapping = aes(x=mpg, y=wt)) +
  geom_point(mapping = aes(y=am)) 
plot(g)

g <- ggplot(data = mtcars,
            mapping = aes(x=mpg, y=wt, color = am)) +
  geom_point() 
plot(g)

mtcars$am_fct <- as.factor(mtcars$am)
g <- ggplot(data = mtcars,
            mapping = aes(x=mpg, y=wt, color = am_fct)) +
  geom_point() 
plot(g)

g <- ggplot(data = mtcars,
            mapping = aes(x=mpg, y=wt, color = am_fct,shape = am_fct)) +
  geom_point() 
plot(g)

g <- ggplot(data = mtcars,
            mapping = aes(x=mpg, y=wt), color = "skyblue") +
  geom_point() 
plot(g)

g <- ggplot() + 
  geom_point(data = mtcars,
            mapping = aes(x=am_fct, y=wt), 
            position = position_jitter(height = 0, width = 0.1)) 
plot(g)