Nothing
test_that("geom_label() throws meaningful errors", {
expect_snapshot_warning(geom_label(position = "jitter", nudge_x = 0.5))
expect_snapshot_error(labelGrob(label = 1:3))
})
test_that("geom_label() rotates labels", {
df <- data_frame0(
x = 1:5,
y = 1,
lab = c("cat", "dog", "banana", "orange", "tea")
)
angle_in <- c(0, 45, 90, 135, 180)
p <- ggplot(df, aes(x, y, label = lab)) +
geom_label(angle = angle_in)
vps <- lapply(
get_layer_grob(p, 1)[[1]]$children,
`[[`, "vp"
)
angle_out <- unname(vapply(vps, `[[`, numeric(1), "angle"))
expect_equal(angle_in, angle_out)
})
test_that("geom_label handles line parameters and colours", {
df <- data.frame(x = 1:3, labels = c("foo", "bar", "baz"))
p <- ggplot(df, aes(x, label = labels, colour = labels, linewidth = x)) +
geom_label(aes(y = 1), border.colour = "black", linetype = 1) +
geom_label(aes(y = 2), text.colour = "black", linetype = 2) +
scale_linewidth(range = c(0.1, 1))
expect_doppelganger("geom_label with line parameters", p)
})
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.