Skip to content

Commit

Permalink
address initial review comments
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil committed Dec 14, 2023
1 parent d6c3cec commit 2a797f8
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/addins.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@ addin_lint <- function() {
}
filename <- rstudioapi::getSourceEditorContext()
if (filename$path == "") {
return("Current source has no path. Please save before continue.")
return("Current source has no path. Please save before continuing.")
}

config_file <- (get("find_config", asNamespace("lintr")))(filename$path)
Expand Down
2 changes: 1 addition & 1 deletion R/backport_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -93,7 +93,7 @@ normalize_r_version <- function(r_version) {
version_names <- c("devel", "release", paste0("oldrel-", seq_len(length(minor_versions) - 2L)))
if (!r_version %in% version_names) {
# This can only trip if e.g. oldrel-99 is requested
cli_abort("{.var r_version} must be a version number or one of {toString(sQuote(version_names))}")
cli_abort("{sQuote(r_version)} must be a version number or one of {toString(sQuote(version_names))}")
}
requested_version <- minor_versions[match(r_version, table = version_names)]
available_patches <- all_versions[startsWith(all_versions, requested_version)]
Expand Down

0 comments on commit 2a797f8

Please sign in to comment.