@@ -262,8 +262,8 @@ marquee_grob <- function(
262
262
function (x ) ! (is.character(x ) && is.na(x [1 ])),
263
263
logical (1 )
264
264
)
265
- has_top <- ! is.na(parsed $ border ) & parsed $ border_size_top != 0
266
- has_bottom <- ! is.na(parsed $ border ) & parsed $ border_size_bottom != 0
265
+ has_top <- ! is.na(parsed $ border ) & parsed $ border_width_top != 0
266
+ has_bottom <- ! is.na(parsed $ border ) & parsed $ border_width_bottom != 0
267
267
for (root in blocks $ start [blocks $ indent == 1 ]) {
268
268
block_tree <- collect_children(
269
269
root ,
@@ -868,10 +868,10 @@ makeContext.marquee_grob <- function(x) {
868
868
logical (1 )
869
869
) |
870
870
(! is.na(x $ text $ border ) &
871
- (x $ text $ border_size_bottom > 0 |
872
- x $ text $ border_size_top > 0 |
873
- x $ text $ border_size_left > 0 |
874
- x $ text $ border_size_right > 0 ))
871
+ (x $ text $ border_width_bottom > 0 |
872
+ x $ text $ border_width_top > 0 |
873
+ x $ text $ border_width_left > 0 |
874
+ x $ text $ border_width_right > 0 ))
875
875
876
876
# # Handle block backgrounds
877
877
block_bg <- has_deco [x $ blocks $ start ]
@@ -886,10 +886,10 @@ makeContext.marquee_grob <- function(x) {
886
886
fill = x $ text $ background [x $ blocks $ start [block_bg ]],
887
887
col = x $ text $ border [x $ blocks $ start [block_bg ]],
888
888
r = x $ text $ border_radius [x $ blocks $ start [block_bg ]],
889
- left = x $ text $ border_size_left [x $ blocks $ start [block_bg ]],
890
- right = x $ text $ border_size_right [x $ blocks $ start [block_bg ]],
891
- top = x $ text $ border_size_top [x $ blocks $ start [block_bg ]],
892
- bottom = x $ text $ border_size_bottom [x $ blocks $ start [block_bg ]]
889
+ left = x $ text $ border_width_left [x $ blocks $ start [block_bg ]],
890
+ right = x $ text $ border_width_right [x $ blocks $ start [block_bg ]],
891
+ top = x $ text $ border_width_top [x $ blocks $ start [block_bg ]],
892
+ bottom = x $ text $ border_width_bottom [x $ blocks $ start [block_bg ]]
893
893
)
894
894
895
895
# # Handle span backgrounds
@@ -946,10 +946,10 @@ makeContext.marquee_grob <- function(x) {
946
946
fill = c(block_rects $ fill , x $ text $ background [span_rects [, 1 ]]),
947
947
col = c(block_rects $ col , x $ text $ border [span_rects [, 1 ]]),
948
948
r = c(block_rects $ r , x $ text $ border_radius [span_rects [, 1 ]]),
949
- left = c(block_rects $ left , x $ text $ border_size_left [span_rects [, 1 ]]),
950
- right = c(block_rects $ right , x $ text $ border_size_right [span_rects [, 1 ]]),
951
- top = c(block_rects $ top , x $ text $ border_size_top [span_rects [, 1 ]]),
952
- bottom = c(block_rects $ bottom , x $ text $ border_size_bottom [span_rects [, 1 ]])
949
+ left = c(block_rects $ left , x $ text $ border_width_left [span_rects [, 1 ]]),
950
+ right = c(block_rects $ right , x $ text $ border_width_right [span_rects [, 1 ]]),
951
+ top = c(block_rects $ top , x $ text $ border_width_top [span_rects [, 1 ]]),
952
+ bottom = c(block_rects $ bottom , x $ text $ border_width_bottom [span_rects [, 1 ]])
953
953
)
954
954
955
955
# # Extract position of underline and strikethrough
@@ -1384,12 +1384,12 @@ has_identical_background <- function(a, b, style) {
1384
1384
identical(style $ border [a ], style $ border [b ]) &&
1385
1385
(is.na(style $ border [a ]) ||
1386
1386
(identical(
1387
- style $ border_size_bottom [a ],
1388
- style $ border_size_bottom [b ]
1387
+ style $ border_width_bottom [a ],
1388
+ style $ border_width_bottom [b ]
1389
1389
) &&
1390
- identical(style $ border_size_top [a ], style $ border_size_top [b ]) &&
1391
- identical(style $ border_size_left [a ], style $ border_size_left [b ]) &&
1392
- identical(style $ border_size_right [a ], style $ border_size_right [b ])))
1390
+ identical(style $ border_width_top [a ], style $ border_width_top [b ]) &&
1391
+ identical(style $ border_width_left [a ], style $ border_width_left [b ]) &&
1392
+ identical(style $ border_width_right [a ], style $ border_width_right [b ])))
1393
1393
},
1394
1394
a = a ,
1395
1395
b = b
0 commit comments