Skip to content

Commit a15f1ac

Browse files
committed
avoid renaming argument for S3 method consistency purposes
1 parent 7a886b8 commit a15f1ac

File tree

2 files changed

+4
-4
lines changed

2 files changed

+4
-4
lines changed

R/plot-build.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -317,13 +317,13 @@ S7::method(gtable_ggplot, class_ggplot_built) <- function(data) {
317317
# TODO: the S3 generic should be phased out once S7 is adopted more widely
318318
#' @rdname gtable_ggplot
319319
#' @export
320-
ggplot_gtable <- function(plot) {
320+
ggplot_gtable <- function(data) {
321321
UseMethod("ggplot_gtable")
322322
}
323323

324324
#' @export
325-
ggplot_gtable.default <- function(plot) {
326-
gtable_ggplot(plot)
325+
ggplot_gtable.default <- function(data) {
326+
gtable_ggplot(data)
327327
}
328328

329329
#' Generate a ggplot2 plot grob.

man/gtable_ggplot.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)