vars: Quote faceting variables

Description Usage Arguments See Also Examples

View source: R/facet-.r

Description

Just like aes(), vars() is a quoting function that takes inputs to be evaluated in the context of a dataset. These inputs can be:

In both cases, the results (the vectors that the variable represents or the results of the expressions) are used to form faceting groups.

Usage

1

Arguments

...

Variables or expressions automatically quoted. These are evaluated in the context of the data to form faceting groups. Can be named (the names are passed to a labeller).

See Also

aes(), facet_wrap(), facet_grid()

Examples

 1
 2
 3
 4
 5
 6
 7
 8
 9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
p <- ggplot(diamonds) + geom_point(aes(carat, price))
p + facet_wrap(vars(cut, clarity))

# vars() makes it easy to pass variables from wrapper functions:
wrap_by <- function(...) {
  facet_wrap(vars(...), labeller = label_both)
}
p + wrap_by(cut)
p + wrap_by(cut, clarity)


# You can also supply expressions to vars(). In this case it's often a
# good idea to supply a name as well:
p + wrap_by(depth = cut_number(depth, 3))

# Let's create another function for cutting and wrapping a
# variable. This time it will take a named argument instead of dots,
# so we'll have to use the "enquote and unquote" pattern:
wrap_cut <- function(var, n = 3) {
  # Let's enquote the named argument `var` to make it auto-quoting:
  var <- enquo(var)

  # `quo_name()` will create a nice default name:
  nm <- quo_name(var)

  # Now let's unquote everything at the right place. Note that we also
  # unquote `n` just in case the data frame has a column named
  # `n`. The latter would have precedence over our local variable
  # because the data is always masking the environment.
  wrap_by(!!nm := cut_number(!!var, !!n))
}

# Thanks to tidy eval idioms we now have another useful wrapper:
p + wrap_cut(depth)

SahaRahul/ggplot2 documentation built on May 17, 2019, 1:46 p.m.