Skip to content

Commit 1010691

Browse files
committed
Fix width computation
1 parent 37005ce commit 1010691

File tree

1 file changed

+3
-1
lines changed

1 file changed

+3
-1
lines changed

R/reporter-progress.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -534,7 +534,9 @@ issue_header <- function(x, pad = FALSE) {
534534
issue_summary <- function(x, rule = FALSE) {
535535
header <- cli::style_bold(issue_header(x))
536536
if (rule) {
537-
header <- cli::rule(header)
537+
# Don't truncate long test names
538+
width <- max(cli::ansi_nchar(header) + 6, getOption("width"))
539+
header <- cli::rule(header, width = width)
538540
}
539541

540542
paste0(header, "\n", format(x))

0 commit comments

Comments
 (0)