Skip to content

Commit

Permalink
Fix r-devel failure (#2697)
Browse files Browse the repository at this point in the history
Fixes #2695
  • Loading branch information
hadley authored Jul 5, 2024
1 parent 812e8c8 commit 31a6b7d
Showing 1 changed file with 8 additions and 4 deletions.
12 changes: 8 additions & 4 deletions R/build-home-authors.R
Original file line number Diff line number Diff line change
Expand Up @@ -272,10 +272,14 @@ citation_provided <- function(src_path) {
}

citation_auto <- function(pkg) {
cit_info <- utils::packageDescription(
path_file(pkg$src_path),
lib.loc = path_dir(pkg$src_path)
)
desc <- read_desc(pkg$src_path)
cit_info <- as.list(desc$get(desc$fields()))
# utils::packageDescription(
# pkg$package,
# lib.loc = path_dir(pkg$src_path)
# )
# browser()
# C
cit_info$`Date/Publication` <- cit_info$`Date/Publication` %||% Sys.time()
if (!is.null(cit_info$Title)) cit_info$Title <- str_squish(cit_info$Title)

Expand Down

0 comments on commit 31a6b7d

Please sign in to comment.