Skip to content

Commit

Permalink
Spaces at EOL
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Sep 28, 2024
1 parent 0a18bc7 commit 56013d6
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 4 deletions.
2 changes: 1 addition & 1 deletion R/markdown.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,7 @@ markdown_text <- function(pkg, text, ...) {
markdown_path_html(pkg, md_path, ...)
}

markdown_text_inline <- function(pkg,
markdown_text_inline <- function(pkg,
text,
error_path,
error_call = caller_env()) {
Expand Down
6 changes: 3 additions & 3 deletions R/render.R
Original file line number Diff line number Diff line change
Expand Up @@ -163,7 +163,7 @@ check_open_graph <- function(pkg, og, file_path = NULL, call = caller_env()) {
if (is.null(og)) {
return()
}

is_yaml <- is.null(file_path)
base_path <- if (is_yaml) "template.opengraph" else "opengraph"

Expand Down Expand Up @@ -220,7 +220,7 @@ check_open_graph_list <- function(pkg,
}
not <- obj_type_friendly(x)
config_abort(
pkg,
pkg,
"{.field {error_path}} must be a list, not {not}.",
path = file_path,
call = error_call
Expand Down Expand Up @@ -259,7 +259,7 @@ same_contents <- function(path, contents) {

cur_contents <- paste0(read_lines(path), collapse = "\n")
cur_hash <- digest::digest(cur_contents, serialize = FALSE)

identical(new_hash, cur_hash)
}

Expand Down

0 comments on commit 56013d6

Please sign in to comment.