@@ -106,7 +106,7 @@ coord_radial <- function(theta = "x",
106106 place <- in_arc(c(0 , 0.5 , 1 , 1.5 ) * pi , arc )
107107 if (! any(place )) {
108108 cli :: cli_warn(c(
109- " No appropriate placement found for {.arg r.axis.inside }." ,
109+ " No appropriate placement found for outside {.field r.axis}." ,
110110 i = " Will use {.code r.axis.inside = TRUE} instead"
111111 ))
112112 r.axis.inside <- TRUE
@@ -176,7 +176,7 @@ CoordRadial <- ggproto("CoordRadial", Coord,
176176 xlimits <- self $ limits $ r
177177 ylimits <- self $ limits $ theta
178178 }
179- panel_params <- c(
179+ params <- c(
180180 view_scales_polar(scale_x , self $ theta , xlimits ,
181181 expand = params $ expand [c(4 , 2 )]
182182 ),
@@ -191,17 +191,17 @@ CoordRadial <- ggproto("CoordRadial", Coord,
191191 if (is.numeric(axis_rotation )) {
192192 theta_scale <- switch (self $ theta , x = scale_x , y = scale_y )
193193 axis_rotation <- theta_scale $ transform(axis_rotation )
194- axis_rotation <- oob_squish(axis_rotation , panel_params $ theta.range )
194+ axis_rotation <- oob_squish(axis_rotation , params $ theta.range )
195195 axis_rotation <- theta_rescale(
196- axis_rotation , panel_params $ theta.range ,
197- panel_params $ arc , 1
196+ axis_rotation , params $ theta.range ,
197+ params $ arc , 1
198198 )
199- panel_params $ axis_rotation <- rep_len(axis_rotation , length.out = 2 )
199+ params $ axis_rotation <- rep_len(axis_rotation , length.out = 2 )
200200 } else {
201- panel_params $ axis_rotation <- panel_params $ arc
201+ params $ axis_rotation <- params $ arc
202202 }
203203
204- panel_params
204+ params
205205 },
206206
207207 setup_panel_guides = function (self , panel_params , guides , params = list ()) {
0 commit comments