Skip to content

Commit

Permalink
Typos: forgot to remove plot from body of create_layout
Browse files Browse the repository at this point in the history
  • Loading branch information
jtlandis committed Dec 13, 2023
1 parent b1f8ce6 commit fe527fe
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/layout.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@ create_layout <- function(facet, coord, layout = NULL) {
"x" = "not {.cl {class(layout)}"
)
)
ggproto(NULL, layout, facet = plot$facet, coord = plot$coordinates)
ggproto(NULL, layout, facet = facet, coord = coord)
}

#' @rdname ggplot2-ggproto
Expand Down
2 changes: 1 addition & 1 deletion R/plot-build.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,7 +46,7 @@ ggplot_build.ggplot <- function(plot) {

# Initialise panels, add extra data for margins & missing faceting
# variables, and add on a PANEL variable to data
layout <- create_layout(plot$facet, plot$coord, plot$layout)
layout <- create_layout(plot$facet, plot$coordinates, plot$layout)
data <- layout$setup(data, plot$data, plot$plot_env)

# Compute aesthetics to produce data with generalised variable names
Expand Down

0 comments on commit fe527fe

Please sign in to comment.