rm(list = ls())
library(ggplot2)
library(grid)
library(tibble)
sales <- tibble(store = rep(c("ABC", "DEF", "GHI"), each = 2),
metric = factor(rep(c("sales", "satisfaction"), 3),
levels = c("satisfaction", "sales")),
risk = factor(c("medium", "low", "low", "low", "high", "medium"),
levels = c("low", "medium", "high")),
value = signif(runif(6, 0, 100), 4))
sales
## # A tibble: 6 x 4
## store metric risk value
## <chr> <fct> <fct> <dbl>
## 1 ABC sales medium 30.8
## 2 ABC satisfaction low 88.9
## 3 DEF sales low 30.8
## 4 DEF satisfaction low 44.2
## 5 GHI sales high 47.5
## 6 GHI satisfaction medium 38.2
p1 <- ggplot(sales, aes(store, metric)) +
geom_tile(aes(fill = risk), color = "grey50") +
scale_fill_manual(values = c("green", "yellow", "red")) +
scale_x_discrete(position = "top") +
theme_minimal() +
theme(axis.title = element_blank(),
axis.text.x = element_text(angle = 90),
axis.text.x.top = element_text(angle = 90, vjust = 0.5),
legend.position = "none") +
geom_text(aes(label = value)) + theme(plot.margin=unit(c(0,0,2,0), "cm"))
p1

p1 + labs(tag = "arbitrary words") +
theme(plot.tag.position = c(0.8, -0.1))

p1 + annotation_custom(grob = linesGrob(), xmin = 0, xmax = 2, ymin = 0.3, ymax = 0.3) +
labs(tag = "arbitrary words") +
theme(plot.tag.position = c(0.4, -0.1)) +
coord_cartesian(clip="off") +
annotation_custom(grob = linesGrob(arrow=arrow(type="open", ends="last",
length=unit(3,"mm")),
gp=gpar(col="red", lwd=3)), xmin = 0, xmax = 2, ymin = 0.2, ymax = 0.2) +
annotation_custom(grob = grid::textGrob(label = "Text", hjust=0, gp=gpar(col="blue", cex=1.7)),
xmin = 2, xmax = 3, ymin = 0.2, ymax = 0.2)

ggplot(mtcars, aes(mpg, cyl, color = vs)) +
geom_line() +
labs(tag = "arbitrary words") +
theme(plot.tag.position = c(0.8, -0.1), plot.margin=unit(c(0,0,2,0), "cm"))

ggplot(mtcars, aes(mpg, cyl, color = vs)) +
geom_line() + theme(plot.margin=unit(c(0,0,2,0), "cm")) +
annotate("text", x = 12.5, y = 3, label = "Arbitrary text", color = "red") +
coord_cartesian(ylim = c(4, 8), clip = "off")

p <- ggplot(mtcars, aes(x = wt, y = mpg)) + geom_point()
p + annotate("text", x = 4, y = 25, label = "Some text")

p + annotate("text", x = 2:5, y = 25, label = "Some text")

p + annotate("rect", xmin = 3, xmax = 4.2, ymin = 12, ymax = 21,
alpha = .2)

p + annotate("segment", x = 2.5, xend = 4, y = 15, yend = 25,
colour = "blue")

p + annotate("pointrange", x = 3.5, y = 20, ymin = 12, ymax = 28,
colour = "red", size = 1.5)

p + annotate("text", x = 2:3, y = 20:21, label = c("my label", "label 2"))

p + annotate("text", x = 4, y = 25, label = "italic(R) ^ 2 == 0.75",
parse = TRUE)

p + annotate("text", x = 4, y = 25,
label = "paste(italic(R) ^ 2, \" = .75\")", parse = TRUE)

p <- ggplot(mtcars, aes(mpg, wt, colour = cyl)) + geom_point()
p + labs(colour = "Cylinders")

p + labs(x = "New x label")

p + labs(title = "New plot title")

p + labs(title = "New plot title", subtitle = "A subtitle")

p + labs(caption = "(based on data from ...)")

p + labs(title = "title", tag = "A")

p +
labs(title = "title") +
labs(title = NULL)

p <- ggplot(mtcars, aes(wt, mpg)) + geom_point()
p + geom_vline(xintercept = 5)

p + geom_vline(xintercept = 1:5)

p + geom_hline(yintercept = 20)

p + geom_abline()

p + geom_abline(intercept = 20)

coef(lm(mpg ~ wt, data = mtcars))
## (Intercept) wt
## 37.285126 -5.344472
p + geom_abline(intercept = 37, slope = -5)

p + geom_smooth(method = "lm", se = FALSE)
## `geom_smooth()` using formula 'y ~ x'

p <- ggplot(mtcars, aes(mpg, wt)) +
geom_point() +
facet_wrap(~ cyl)
mean_wt <- data.frame(cyl = c(4, 6, 8), wt = c(2.28, 3.11, 4.00))
p + geom_hline(aes(yintercept = wt), mean_wt)

ggplot(mtcars, aes(mpg, wt, colour = wt)) +
geom_point() +
geom_hline(aes(yintercept = wt, colour = wt), mean_wt) +
facet_wrap(~ cyl)

df <- data.frame(x = 1:10, y = 1:10)
base <- ggplot(df, aes(x, y)) +
geom_blank() +
theme_bw()
base + annotation_custom(
grob = grid::roundrectGrob(),
xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf
)

df2 <- data.frame(x = 1 , y = 1)
g <- ggplotGrob(ggplot(df2, aes(x, y)) +
geom_point() +
theme(plot.background = element_rect(colour = "black")))
base +
annotation_custom(grob = g, xmin = 1, xmax = 10, ymin = 8, ymax = 10)

b <- ggplot(mtcars, aes(wt, mpg)) +
geom_point()
b + geom_curve(
aes(x = 3, y = 22, xend = 3.5, yend = 15),
arrow = arrow(
length = unit(0.03, "npc"),
type="closed"
),
colour = "#EC7014",
size = 1.2,
angle = 90
)
