Skip to content

Commit

Permalink
Merge pull request #736 from r-lib/picky-things
Browse files Browse the repository at this point in the history
Nitpicks to get totally clean R CMD check
  • Loading branch information
gaborcsardi authored Oct 25, 2024
2 parents 38cef38 + 0c95923 commit fb314ce
Show file tree
Hide file tree
Showing 5 changed files with 9 additions and 9 deletions.
2 changes: 1 addition & 1 deletion R/ansi-hyperlink.R
Original file line number Diff line number Diff line change
Expand Up @@ -409,7 +409,7 @@ ansi_hyperlink_types <- function() {
vignette = FALSE
)

} else if (rs$hyperlink) {
} else if (isTRUE(rs$hyperlink)) {
list(
href = TRUE,
run = structure(run, type = "rstudio"),
Expand Down
2 changes: 1 addition & 1 deletion R/cliapp-docs.R
Original file line number Diff line number Diff line change
Expand Up @@ -544,7 +544,7 @@ NULL
#' convert relative paths, and paths starting with `~` to aboslute path.
#'
#' ```{asciicast links-file-1}
#' cli_text("... edit your {.file ~/.Rprofile} file.}")
#' cli_text("... edit your {.file ~/.Rprofile} file.")
#' ```
#'
#' ## Link text
Expand Down
8 changes: 4 additions & 4 deletions tests/testthat/_snaps/spark.md
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
# spark_bar [plain]

Code
spark_bar(seq(0, 1, length = 8))
spark_bar(seq(0, 1, length.out = 8))
Output
__,,**##
Code
Expand All @@ -12,7 +12,7 @@
# spark_bar [unicode]

Code
spark_bar(seq(0, 1, length = 8))
spark_bar(seq(0, 1, length.out = 8))
Output
▁▂▃▄▅▆▇█
Code
Expand All @@ -23,14 +23,14 @@
# spark_line [plain]

Code
spark_line(seq(0, 1, length = 10))
spark_line(seq(0, 1, length.out = 10))
Output
_,,-^

# spark_line [unicode]

Code
spark_line(seq(0, 1, length = 10))
spark_line(seq(0, 1, length.out = 10))
Output
⣀⡠⠔⠊⠉

2 changes: 1 addition & 1 deletion tests/testthat/test-inline-2.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@ start_app()
on.exit(stop_app(), add = TRUE)

test_that_cli(
config = c("plain", "ansi"),
configs = c("plain", "ansi"),
"quoting phrases that don't start or end with letter or number", {

expect_snapshot(local({
Expand Down
4 changes: 2 additions & 2 deletions tests/testthat/test-spark.R
Original file line number Diff line number Diff line change
@@ -1,13 +1,13 @@

test_that_cli(configs = c("plain", "unicode"), "spark_bar", {
expect_snapshot({
spark_bar(seq(0, 1, length = 8))
spark_bar(seq(0, 1, length.out = 8))
spark_bar(c(0, NA, 0.5, NA, 1))
})
})

test_that_cli(configs = c("plain", "unicode"), "spark_line", {
expect_snapshot({
spark_line(seq(0, 1, length = 10))
spark_line(seq(0, 1, length.out = 10))
})
})

0 comments on commit fb314ce

Please sign in to comment.