purrr::map error when building site for package

Hi,
I'm trying to update my package website and got this error when building site:

> pkgdown::build_site()
-- Installing package into temporary library -----------------------------------
== Building pkgdown site =======================================================
Reading from: '/home/denis/workspace/h/haine/Rpackages/episensr'
Writing to:   '/home/denis/workspace/h/haine/Rpackages/episensr/docs'
-- Initialising site -----------------------------------------------------------
-- Building home ---------------------------------------------------------------
Writing '404.html'
-- Building function reference -------------------------------------------------
Loading required package: ggplot2
Reading 'man/boot.bias.Rd'
Error: 
! in callr subprocess.
Caused by error in `purrr::map(topics, build_reference_topic, pkg = pkg, lazy = lazy, …`:
! In index: 1.
ℹ See `$stdout` and `$stderr` for standard output and error.
Type .Last.error to see the more details.
> .Last.error
<callr_error/rlib_error_3_0/rlib_error/error>
Error: 
! in callr subprocess.
Caused by error in `purrr::map(topics, build_reference_topic, pkg = pkg, lazy = lazy, …`:
! In index: 1.
ℹ See `$stdout` and `$stderr` for standard output and error.
---
Backtrace:
1. pkgdown::build_site()
2. pkgdown:::build_site_external(pkg = pkg, examples = examples, run_dont_run = run_dont_run, …
3. callr::r(function(..., cli_colors, pkgdown_internet) { …
4. callr:::get_result(output = out, options)
5. callr:::throw(callr_remote_error(remerr, output), parent = fix_msg(remerr[[3]]))
---
Subprocess backtrace:
 1. pkgdown::build_site(...)
 2. pkgdown:::build_site_local(pkg = pkg, examples = examples, run_dont_run = run_dont_run, …
 3. pkgdown::build_reference(pkg, lazy = lazy, examples = examples, run_dont_run = run_dont_run, …
 4. purrr::map(topics, build_reference_topic, pkg = pkg, lazy = lazy, …
 5. purrr:::map_("list", .x, .f, ..., .progress = .progress)
 6. purrr:::with_indexed_errors(i = i, names = names, error_call = .purrr_error_call, …
 7. base::withCallingHandlers(expr, error = function(cnd) { …
 8. purrr:::call_with_cleanup(map_impl, environment(), .type, .progress, …
 9. local .f(.x[[i]], ...)
10. base::withCallingHandlers(data_reference_topic(topic, pkg, examples_env = examples_env, …
11. pkgdown:::data_reference_topic(topic, pkg, examples_env = examples_env, …
12. pkgdown:::run_examples(tags$tag_examples[[1]], env = if (is.null(examples_env)) NULL else new.env(parent =…
13. pkgdown:::highlight_examples(code, topic, env = env)
14. downlit::evaluate_and_highlight(code, fig_save = fig_save_topic, …
15. evaluate::evaluate(code, child_env(env), new_device = TRUE, output_handler = output_handler)
16. grDevices::dev.new()
17. base::do.call(dev, a)
18. (function (...) …
19. ragg::agg_png(..., bg = bg)
20. base::.handleSimpleError(function (err) …
21. local h(simpleError(msg, call))
22. rlang::abort(msg, parent = err)
23. | rlang:::signal_abort(cnd, .file)
24. | base::signalCondition(cnd)
25. (function (cnd) …
26. cli::cli_abort(message, location = i, name = name, parent = cnd, …
27. | rlang::abort(message, ..., call = call, use_cli_format = TRUE, …
28. | rlang:::signal_abort(cnd, .file)
29. | base::signalCondition(cnd)
30. global (function (e) …

Any idea what I should do? Thanks!
Denis

1 Like

Found it!

update.packages(ask = FALSE, checkBuilt = TRUE)

i.e., re-installing packages built with a previous version of R.

3 Likes

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.