CRAN Package Check Results for Maintainer ‘Thomas Lin Pedersen <thomas.pedersen at posit.co>’

Last updated on 2024-09-22 09:49:55 CEST.

Package ERROR NOTE OK
devoid 13
farver 2 11
ggplot2 10 3
gtable 13
marquee 1 4 8
ragg 7 6
scales 13
svglite 10 3
systemfonts 4 9
textshaping 7 6

Package devoid

Current CRAN status: OK: 13

Package farver

Current CRAN status: NOTE: 2, OK: 11

Version: 2.1.2
Check: installed package size
Result: NOTE installed size is 5.4Mb sub-directories of 1Mb or more: help 1.6Mb libs 3.8Mb Flavors: r-release-macos-x86_64, r-oldrel-macos-x86_64

Package ggplot2

Current CRAN status: NOTE: 10, OK: 3

Version: 3.5.1
Check: Rd cross-references
Result: NOTE Found the following Rd file(s) with Rd \link{} targets missing package anchors: ggplot2-ggproto.Rd: gtable ggplot_gtable.Rd: gtable Please provide package anchors for all Rd \link{} targets not in the package itself and the base packages. Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc, r-devel-windows-x86_64

Version: 3.5.1
Check: installed package size
Result: NOTE installed size is 6.0Mb sub-directories of 1Mb or more: R 1.5Mb doc 2.3Mb help 1.2Mb Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-windows-x86_64, r-release-macos-arm64, r-release-macos-x86_64, r-release-windows-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64, r-oldrel-windows-x86_64

Package gtable

Current CRAN status: OK: 13

Package marquee

Current CRAN status: ERROR: 1, NOTE: 4, OK: 8

Version: 0.1.0
Check: examples
Result: ERROR Running examples in ‘marquee-Ex.R’ failed The error most likely occurred in: > ### Name: element_marquee > ### Title: ggplot2 theme element supporting marquee syntax > ### Aliases: element_marquee > > ### ** Examples > > ## Don't show: > if (utils::packageVersion("base") > "4.3" && rlang::is_installed("ggplot2")) (if (getRversion() >= "3.4") withAutoprint else force)({ # examplesIf + ## End(Don't show) + library(ggplot2) + p <- ggplot(mtcars) + + geom_point(aes(mpg, disp)) + + labs(title = "A {.red *marquee*} title\n* Look at this bullet list\n\n* great, huh?") + + theme_gray(base_size = 6) + + theme(title = element_marquee()) + + plot(p) + + ggplot(mtcars) + + geom_histogram(aes(x = mpg)) + + labs(title = + "I put a plot in your title so you can plot while you title + + ![](p) + + What more could you _possibly_ want?") + + theme(title = element_marquee()) + ## Don't show: + }) # examplesIf > library(ggplot2) > p <- ggplot(mtcars) + geom_point(aes(mpg, disp)) + labs(title = "A {.red *marquee*} title\n* Look at this bullet list\n\n* great, huh?") + + theme_gray(base_size = 6) + theme(title = element_marquee()) > plot(p) *** caught segfault *** address 0x1, cause 'memory not mapped' Traceback: 1: get_string_shape_c(strings, id, path, as.integer(index), features, as.numeric(size), as.numeric(res), as.numeric(lineheight), as.integer(align) - 1L, as.numeric(hjust), as.numeric(vjust), as.numeric(max_width), as.numeric(tracking), as.numeric(indent), as.numeric(hanging), as.numeric(space_before), as.numeric(space_after)) 2: textshaping::shape_text(bullets$bullet, family = parsed$family[bullets$index], italic = parsed$italic[bullets$index], weight = parsed$weight[bullets$index], width = parsed$width[bullets$index], features = parsed$features[bullets$index], size = parsed$size[bullets$index], res = 600, align = "right", hjust = 1, vjust = 1) 3: marquee_grob(label, style, x = x, y = y, width = width, hjust = hjust %||% element$hjust, vjust = vjust %||% element$vjust, angle = angle) 4: element_grob.element_marquee(el, ...) 5: element_grob(el, ...) 6: element_render(theme = theme, element = paste0("axis.title.", label, modify), label = labels[[label]][[i]], margin_x = label == "y", margin_y = label == "x") 7: FUN(X[[i]], ...) 8: lapply(c(1, 2), function(i) { modify <- if (i == 1) { switch(label, x = ".top", y = ".left") } else { switch(label, x = ".bottom", y = ".right") } if (is.null(labels[[label]][[i]]) || is.waive(labels[[label]][[i]])) return(zeroGrob()) element_render(theme = theme, element = paste0("axis.title.", label, modify), label = labels[[label]][[i]], margin_x = label == "y", margin_y = label == "x")}) 9: FUN(X[[i]], ...) 10: lapply(names(labels), function(label) { lapply(c(1, 2), function(i) { modify <- if (i == 1) { switch(label, x = ".top", y = ".left") } else { switch(label, x = ".bottom", y = ".right") } if (is.null(labels[[label]][[i]]) || is.waive(labels[[label]][[i]])) return(zeroGrob()) element_render(theme = theme, element = paste0("axis.title.", label, modify), label = labels[[label]][[i]], margin_x = label == "y", margin_y = label == "x") })}) 11: render_labels(..., self = self) 12: self$render_labels(labels, theme) 13: render(..., self = self) 14: layout$render(geom_grobs, data, theme, plot$labels) 15: ggplot_gtable.ggplot_built(data) 16: ggplot_gtable(data) 17: plot.ggplot(p) 18: plot(p) 19: eval(ei, envir) 20: eval(ei, envir) 21: withVisible(eval(ei, envir)) 22: source(exprs = exprs, local = local, print.eval = print., echo = echo, max.deparse.length = max.deparse.length, width.cutoff = width.cutoff, deparseCtrl = deparseCtrl, skip.echo = skip.echo, ...) 23: (if (getRversion() >= "3.4") withAutoprint else force)({ library(ggplot2) p <- ggplot(mtcars) + geom_point(aes(mpg, disp)) + labs(title = "A {.red *marquee*} title\n* Look at this bullet list\n\n* great, huh?") + theme_gray(base_size = 6) + theme(title = element_marquee()) plot(p) ggplot(mtcars) + geom_histogram(aes(x = mpg)) + labs(title = "I put a plot in your title so you can plot while you title\n\n![](p)\n\nWhat more could you _possibly_ want?") + theme(title = element_marquee())}) An irrecoverable exception occurred. R is aborting now ... Flavor: r-devel-linux-x86_64-fedora-gcc

Version: 0.1.0
Check: tests
Result: ERROR Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: > # This file is part of the standard setup for testthat. > # It is recommended that you do not modify it. > # > # Where should you do additional test configuration? > # Learn more about the roles of various files in: > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview > # * https://testthat.r-lib.org/articles/special-files.html > > library(testthat) > library(marquee) > > test_check("marquee") *** caught segfault *** address 0x1, cause 'memory not mapped' Traceback: 1: get_string_shape_c(strings, id, path, as.integer(index), features, as.numeric(size), as.numeric(res), as.numeric(lineheight), as.integer(align) - 1L, as.numeric(hjust), as.numeric(vjust), as.numeric(max_width), as.numeric(tracking), as.numeric(indent), as.numeric(hanging), as.numeric(space_before), as.numeric(space_after)) 2: textshaping::shape_text(bullets$bullet, family = parsed$family[bullets$index], italic = parsed$italic[bullets$index], weight = parsed$weight[bullets$index], width = parsed$width[bullets$index], features = parsed$features[bullets$index], size = parsed$size[bullets$index], res = 600, align = "right", hjust = 1, vjust = 1) 3: marquee_grob(label, style, x = x, y = y, width = width, hjust = hjust %||% element$hjust, vjust = vjust %||% element$vjust, angle = angle) 4: element_grob.element_marquee(elem, "test", hjust = "left", vjust = "center", margin_x = TRUE, margin_y = TRUE) 5: eval(code, test_env) 6: eval(code, test_env) 7: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error) 8: doTryCatch(return(expr), name, parentenv, handler) 9: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 10: tryCatchList(expr, names[-nh], parentenv, handlers[-nh]) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { }) 15: test_code(desc, code, env = parent.frame(), default_reporter = local_interactive_reporter()) 16: test_that("element_marquee() inserts aesthetics into the style", { skip_if_not(getRversion() >= "4.3") elem <- element_marquee("serif", colour = "red", size = 6, margin = ggplot2::margin(1, 1, 1, 1)) elem <- element_grob.element_marquee(elem, "test", hjust = "left", vjust = "center", margin_x = TRUE, margin_y = TRUE) expect_equal(elem$text$family[1], "serif") expect_equal(elem$text$color[1], "red") expect_equal(elem$text$size[1], 6) expect_equal(elem$text$padding_bottom, c(1, 0)) }) 17: eval(code, test_env) 18: eval(code, test_env) 19: withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error) 20: doTryCatch(return(expr), name, parentenv, handler) 21: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 22: tryCatchList(expr, names[-nh], parentenv, handlers[-nh]) 23: doTryCatch(return(expr), name, parentenv, handler) 24: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]), names[nh], parentenv, handlers[[nh]]) 25: tryCatchList(expr, classes, parentenv, handlers) 26: tryCatch(withCallingHandlers({ eval(code, test_env) if (!handled && !is.null(test)) { skip_empty() }}, expectation = handle_expectation, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error), error = handle_fatal, skip = function(e) { }) 27: test_code(test = NULL, code = exprs, env = env, default_reporter = StopReporter$new()) 28: source_file(path, env = env(env), desc = desc, error_call = error_call) 29: FUN(X[[i]], ...) 30: lapply(test_paths, test_one_file, env = env, desc = desc, error_call = error_call) 31: doTryCatch(return(expr), name, parentenv, handler) 32: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 33: tryCatchList(expr, classes, parentenv, handlers) 34: tryCatch(code, testthat_abort_reporter = function(cnd) { cat(conditionMessage(cnd), "\n") NULL}) 35: with_reporter(reporters$multi, lapply(test_paths, test_one_file, env = env, desc = desc, error_call = error_call)) 36: test_files_serial(test_dir = test_dir, test_package = test_package, test_paths = test_paths, load_helpers = load_helpers, reporter = reporter, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, desc = desc, load_package = load_package, error_call = error_call) 37: test_files(test_dir = path, test_paths = test_paths, test_package = package, reporter = reporter, load_helpers = load_helpers, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, load_package = load_package, parallel = parallel) 38: test_dir("testthat", package = package, reporter = reporter, ..., load_package = "installed") 39: test_check("marquee") An irrecoverable exception occurred. R is aborting now ... Flavor: r-devel-linux-x86_64-fedora-gcc

Version: 0.1.0
Check: re-building of vignette outputs
Result: ERROR Error(s) in re-building vignettes: --- re-building ‘marquee.Rmd’ using rmarkdown *** caught segfault *** address 0x1, cause 'memory not mapped' Traceback: 1: get_string_shape_c(strings, id, path, as.integer(index), features, as.numeric(size), as.numeric(res), as.numeric(lineheight), as.integer(align) - 1L, as.numeric(hjust), as.numeric(vjust), as.numeric(max_width), as.numeric(tracking), as.numeric(indent), as.numeric(hanging), as.numeric(space_before), as.numeric(space_after)) 2: textshaping::shape_text(bullets$bullet, family = parsed$family[bullets$index], italic = parsed$italic[bullets$index], weight = parsed$weight[bullets$index], width = parsed$width[bullets$index], features = parsed$features[bullets$index], size = parsed$size[bullets$index], res = 600, align = "right", hjust = 1, vjust = 1) 3: marquee_grob(md_text, classic_style()) 4: eval(expr, envir) 5: eval(expr, envir) 6: withVisible(eval(expr, envir)) 7: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = invokeRestart("eval_error", cnd))}) 8: eval(call) 9: eval(call) 10: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 11: doWithOneRestart(return(expr), restart) 12: withOneRestart(expr, restarts[[1L]]) 13: withRestartList(expr, restarts[-nr]) 14: doWithOneRestart(return(expr), restart) 15: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 16: withRestartList(expr, restarts[-nr]) 17: doWithOneRestart(return(expr), restart) 18: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 19: withRestartList(expr, restarts) 20: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE, eval_error = function(cnd) signalCondition(cnd)) 21: evaluate::evaluate(...) 22: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 23: in_dir(input_dir(), expr) 24: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 25: eng_r(options) 26: block_exec(params) 27: call_block(x) 28: process_group(group) 29: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) if (xfun::pkg_available("rlang", "1.0.0")) rlang::entrace(e)) 30: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) if (xfun::pkg_available("rlang", "1.0.0")) rlang::entrace(e)), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from lines ", loc) }, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 31: process_file(text, output) 32: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 33: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 34: vweave_rmarkdown(...) 35: engine$weave(file, quiet = quiet, encoding = enc) 36: doTryCatch(return(expr), name, parentenv, handler) 37: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 38: tryCatchList(expr, classes, parentenv, handlers) 39: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 40: tools:::.buildOneVignette("marquee.Rmd", "/data/gannet/ripley/R/packages/tests-devel/marquee.Rcheck/vign_test/marquee", TRUE, FALSE, "marquee", "UTF-8", "/tmp/RtmpxT2g1n/working_dir/RtmpCXcgL5/file389bb4ec564dc.rds") An irrecoverable exception occurred. R is aborting now ... --- re-building ‘marquee_style.Rmd’ using rmarkdown --- finished re-building ‘marquee_style.Rmd’ --- re-building ‘marquee_syntax.Rmd’ using rmarkdown --- finished re-building ‘marquee_syntax.Rmd’ SUMMARY: processing the following file failed: ‘marquee.Rmd’ Error: Vignette re-building failed. Execution halted Flavor: r-devel-linux-x86_64-fedora-gcc

Version: 0.1.0
Check: installed package size
Result: NOTE installed size is 6.0Mb sub-directories of 1Mb or more: doc 2.3Mb libs 2.8Mb Flavors: r-release-macos-arm64, r-release-macos-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64

Package ragg

Current CRAN status: NOTE: 7, OK: 6

Version: 1.3.3
Check: installed package size
Result: NOTE installed size is 5.1Mb sub-directories of 1Mb or more: libs 4.9Mb Flavors: r-devel-windows-x86_64, r-release-macos-arm64, r-release-macos-x86_64, r-release-windows-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64, r-oldrel-windows-x86_64

Package scales

Current CRAN status: OK: 13

Package svglite

Current CRAN status: NOTE: 10, OK: 3

Additional issues

rchk

Version: 2.1.3
Check: C++ specification
Result: NOTE Specified C++11: please drop specification unless essential Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc, r-devel-linux-x86_64-fedora-clang, r-devel-linux-x86_64-fedora-gcc, r-patched-linux-x86_64, r-release-linux-x86_64, r-release-macos-arm64, r-release-macos-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64

Package systemfonts

Current CRAN status: NOTE: 4, OK: 9

Version: 1.1.0
Check: installed package size
Result: NOTE installed size is 22.7Mb sub-directories of 1Mb or more: libs 22.4Mb Flavors: r-release-macos-arm64, r-release-macos-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64

Package textshaping

Current CRAN status: NOTE: 7, OK: 6

Version: 0.4.0
Check: Rd cross-references
Result: NOTE Found the following Rd file(s) with Rd \link{} targets missing package anchors: text_width.Rd: shape_string Please provide package anchors for all Rd \link{} targets not in the package itself and the base packages. Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc, r-devel-windows-x86_64

Version: 0.4.0
Check: installed package size
Result: NOTE installed size is 21.2Mb sub-directories of 1Mb or more: libs 21.0Mb Flavors: r-release-macos-arm64, r-release-macos-x86_64, r-oldrel-macos-arm64, r-oldrel-macos-x86_64