File tree Expand file tree Collapse file tree 2 files changed +16
-0
lines changed
Expand file tree Collapse file tree 2 files changed +16
-0
lines changed Original file line number Diff line number Diff line change @@ -84,6 +84,8 @@ S3method(guide_geom,default)
8484S3method(guide_merge,default)
8585S3method(guide_train,default)
8686S3method(guide_transform,default)
87+ S3method(heightDetails,ggplot)
88+ S3method(heightDetails,ggplot_built)
8789S3method(heightDetails,titleGrob)
8890S3method(heightDetails,zeroGrob)
8991S3method(limits,Date)
@@ -146,6 +148,8 @@ S3method(vec_ptype2,mapped_discrete.double)
146148S3method(vec_ptype2,mapped_discrete.factor)
147149S3method(vec_ptype2,mapped_discrete.integer)
148150S3method(vec_ptype2,mapped_discrete.mapped_discrete)
151+ S3method(widthDetails,ggplot)
152+ S3method(widthDetails,ggplot_built)
149153S3method(widthDetails,titleGrob)
150154S3method(widthDetails,zeroGrob)
151155export("%+%")
Original file line number Diff line number Diff line change @@ -67,3 +67,15 @@ height_cm <- function(x) {
6767 cli :: cli_abort(" Don't know how to get height of {.cls {class(x)}} object" )
6868 }
6969}
70+
71+ # ' @export
72+ widthDetails.ggplot <- function (x ) widthDetails(ggplotGrob(x ))
73+
74+ # ' @export
75+ widthDetails.ggplot_built <- widthDetails.ggplot
76+
77+ # ' @export
78+ heightDetails.ggplot <- function (x ) heightDetails(ggplotGrob(x ))
79+
80+ # ' @export
81+ heightDetails.ggplot_built <- heightDetails.ggplot
You can’t perform that action at this time.
0 commit comments