1context("Labellers")
2
3test_that("label_bquote has access to functions in the calling environment", {
4  labels <- data.frame(lab = letters[1:2])
5  attr(labels, "facet") <- "wrap"
6  labeller <- label_bquote(rows = .(paste0(lab, ":")))
7  labels_calc <- labeller(labels)
8  expect_equal(labels_calc[[1]][[1]], "a:")
9})
10