Skip to content

Commit 37005ce

Browse files
committed
More polishing
1 parent 288f99d commit 37005ce

File tree

3 files changed

+6
-6
lines changed

3 files changed

+6
-6
lines changed

R/reporter-progress.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -534,7 +534,7 @@ 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, width = max(cli::ansi_nchar(header) + 6, 80))
537+
header <- cli::rule(header)
538538
}
539539

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

R/snapshot-file.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -101,7 +101,7 @@ expect_snapshot_file <- function(path,
101101

102102
snapshotter <- get_snapshotter()
103103
if (is.null(snapshotter)) {
104-
snapshot_not_available("New path", path)
104+
snapshot_not_available(path)
105105
return(invisible())
106106
}
107107

R/snapshot.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -272,7 +272,7 @@ expect_snapshot_helper <- function(lab, val,
272272

273273
snapshotter <- get_snapshotter()
274274
if (is.null(snapshotter)) {
275-
snapshot_not_available("Current snapshot", save(val))
275+
snapshot_not_available(save(val))
276276
return(invisible())
277277
}
278278

@@ -322,12 +322,12 @@ snapshot_accept_hint <- function(variant, file, reset_output = TRUE) {
322322
)
323323
}
324324

325-
snapshot_not_available <- function(header, message) {
325+
snapshot_not_available <- function(message) {
326326
local_reporter_output()
327327

328-
cat(cli::rule(header), "\n", sep = "")
328+
cat(cli::rule("Snapshot"), "\n", sep = "")
329329
cli::cli_inform(c(
330-
i = "Can't save snapshot or compare to reference when testing interactively."
330+
i = "Can't save or compare to reference when testing interactively."
331331
))
332332
cat(message, "\n", sep = "")
333333
cat(cli::rule(), "\n", sep = "")

0 commit comments

Comments
 (0)