@@ -54,58 +54,73 @@ subtheme <- function(elements, prefix = "", suffix = "", call = caller_env()) {
5454
5555# ' @export
5656# ' @describeIn subtheme Theme specification for all axes.
57- theme_sub_axis <- function (title , text , ticks , ticks.length , line ) {
57+ theme_sub_axis <- function (title , text , ticks , ticks.length , line , minor.ticks.length ) {
5858 subtheme(find_args(), " axis." )
5959}
6060
6161# ' @export
6262# ' @describeIn subtheme Theme specification for both x axes.
63- theme_sub_axis_x <- function (title , text , ticks , ticks.length , line ) {
63+ theme_sub_axis_x <- function (title , text , ticks , ticks.length , line , minor.ticks.length ) {
6464 subtheme(find_args(), " axis." , " .x" )
6565}
6666
6767# ' @export
6868# ' @describeIn subtheme Theme specification for both y axes.
69- theme_sub_axis_y <- function (title , text , ticks , ticks.length , line ) {
69+ theme_sub_axis_y <- function (title , text , ticks , ticks.length , line , minor.ticks.length ) {
7070 subtheme(find_args(), " axis." , " .y" )
7171}
7272
7373# ' @export
7474# ' @describeIn subtheme Theme specification for the bottom x axis.
75- theme_sub_axis_bottom <- function (title , text , ticks , ticks.length , line ) {
75+ theme_sub_axis_bottom <- function (title , text , ticks , ticks.length , line , minor.ticks , minor.ticks.length ) {
7676 subtheme(find_args(), " axis." , " .x.bottom" )
7777}
7878
7979# ' @export
8080# ' @describeIn subtheme Theme specification for the top x axis.
81- theme_sub_axis_top <- function (title , text , ticks , ticks.length , line ) {
81+ theme_sub_axis_top <- function (title , text , ticks , ticks.length , line , minor.ticks , minor.ticks.length ) {
8282 subtheme(find_args(), " axis." , " .x.top" )
8383}
8484
8585# ' @export
8686# ' @describeIn subtheme Theme specification for the left y axis.
87- theme_sub_axis_left <- function (title , text , ticks , ticks.length , line ) {
87+ theme_sub_axis_left <- function (title , text , ticks , ticks.length , line , minor.ticks , minor.ticks.length ) {
8888 subtheme(find_args(), " axis." , " .y.left" )
8989}
9090
9191# ' @export
9292# ' @describeIn subtheme Theme specification for the right y axis.
93- theme_sub_axis_right <- function (title , text , ticks , ticks.length , line ) {
93+ theme_sub_axis_right <- function (title , text , ticks , ticks.length , line , minor.ticks , minor.ticks.length ) {
9494 subtheme(find_args(), " axis." , " .y.right" )
9595}
9696
9797# ' @export
9898# ' @describeIn subtheme Theme specification for the legend.
99- theme_sub_legend <- function (background , margin , spacing , spacing.x , spacing.y ,
100- key , key.size , key.height , key.width , text , title ,
101- position , direction , justification , box , box.just ,
102- box.margin , box.background , box.spacing ) {
99+ theme_sub_legend <- function (
100+ # Text stuff
101+ text , text.position , title , title.position ,
102+ # Drawn elements
103+ background , frame , ticks , ticks.length , axis.line ,
104+ # Spacings
105+ spacing , spacing.x , spacing.y , margin ,
106+ # Seys
107+ key , key.size , key.height , key.width , key.spacing , key.spacing.x ,
108+ key.spacing.y , key.justification ,
109+ # Settings
110+ byrow , position , direction , location , position.inside ,
111+ # Justification
112+ justification , justification.top , justification.bottom , justification.left ,
113+ justification.right , justification.inside ,
114+ # Box
115+ box , box.just , box.margin , box.background , box.spacing
116+ ) {
103117 subtheme(find_args(), " legend." )
104118}
105119
106120# ' @export
107121# ' @describeIn subtheme Theme specification for the panels.
108- theme_sub_panel <- function (background , border , spacing , spacing.x , spacing.y ,
122+ theme_sub_panel <- function (background , border ,
123+ widths , heights , spacing , spacing.x , spacing.y ,
109124 grid , grid.major , grid.minor , grid.major.x ,
110125 grid.major.y , grid.minor.x , grid.minor.y , ontop ) {
111126 subtheme(find_args(), " panel." )
0 commit comments