Skip to content

Commit 26f7a39

Browse files
krlmlrclauswilke
authored andcommitted
Document now unused argument (#2808)
1 parent 1e01e68 commit 26f7a39

File tree

2 files changed

+4
-6
lines changed

2 files changed

+4
-6
lines changed

R/labeller.r

Lines changed: 2 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -184,8 +184,7 @@ find_names <- function(expr) {
184184
#'
185185
#' @param rows Backquoted labelling expression for rows.
186186
#' @param cols Backquoted labelling expression for columns.
187-
#' @param default Default labeller function for the rows or the
188-
#' columns when no plotmath expression is provided.
187+
#' @param default Unused, kept for compatibility.
189188
#' @seealso \link{labellers}, [labeller()],
190189
#' @export
191190
#' @examples
@@ -196,7 +195,7 @@ find_names <- function(expr) {
196195
#' p + facet_grid(. ~ vs, labeller = label_bquote(cols = .(vs) ^ .(vs)))
197196
#' p + facet_grid(. ~ vs + am, labeller = label_bquote(cols = .(am) ^ .(vs)))
198197
label_bquote <- function(rows = NULL, cols = NULL,
199-
default = label_value) {
198+
default) {
200199
cols_quoted <- substitute(cols)
201200
rows_quoted <- substitute(rows)
202201
has_warned <- FALSE

man/label_bquote.Rd

Lines changed: 2 additions & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)