Skip to content

Commit

Permalink
Fix URLs in news.R script
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Jul 25, 2023
1 parent 3b43a3a commit 525ebbe
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 2 deletions.
3 changes: 2 additions & 1 deletion exec/news.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,11 +107,12 @@ New package releases on CRAN
format_result <- function(result) {
pkg <- result$package
ago <- vague_dt(Sys.time() - parse_iso_8601(result$date))
url <- paste0("https://r-pkg.org/pkg/", pkg$Package)
cli_li()
cli_text("{.pkg {pkg$Package}} {pkg$Version} --
{ago} by {.emph {pkg$Maintainer}}")
cli_text("{pkg$Title}")
cli_text("{.url https://r-pkg.org/pkg/{pkg$Package}}")
cli_text("{.url {url}}")
}

if (is.null(sys.calls())) {
Expand Down
3 changes: 2 additions & 1 deletion inst/examples/apps/news.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,11 +107,12 @@ New package releases on CRAN
format_result <- function(result) {
pkg <- result$package
ago <- vague_dt(Sys.time() - parse_iso_8601(result$date))
url <- paste0("https://r-pkg.org/pkg/", pkg$Package)
cli_li()
cli_text("{.pkg {pkg$Package}} {pkg$Version} --
{ago} by {.emph {pkg$Maintainer}}")
cli_text("{pkg$Title}")
cli_text("{.url https://r-pkg.org/pkg/{pkg$Package}}")
cli_text("{.url {url}}")
}

if (is.null(sys.calls())) {
Expand Down

0 comments on commit 525ebbe

Please sign in to comment.