ggstatsplot 0.9.4 Error - no longer running?

hello

ggstatsplot has stopped working and I'm looking for any suggestions as to what may have happened
(error and code below). I'm running R Studio 2022.07.0 Build 548 and R version 4.2.1 (2022-06-23) under OS 12.3.1.

All thoughts gratefully received.

Marc

library(ggstatsplot)
ggbetweenstats(iris, Species, Sepal.Length)
Error:
! Problem while converting geom to grob.
:information_source: Error occurred in the 6th layer.
Caused by error in vec_restore_dispatch():
! Can't convert to <ggplot2_mapped_discrete>.

rlang::last_error()
<error/rlang_error>
Error:
! Problem while converting geom to grob.
:information_source: Error occurred in the 6th layer.
Caused by error in vec_restore_dispatch():
! Can't convert to <ggplot2_mapped_discrete>.


Backtrace:

  1. base (local) <fn>(x)
  2. ggplot2:::print.ggplot(x)
  3. ggplot2:::ggplot_gtable.ggplot_built(data)
  4. ggplot2:::by_layer(...)
  5. ggplot2 (local) f(l = layers[[i]], d = data[[i]])
  6. l$draw_geom(d, layout)
  7. ggplot2 (local) draw_geom(..., self = self)
  8. self$geom$draw_layer(...)
  9. ggplot2 (local) draw_layer(..., self = self)
  10. base::lapply(...)
  11. ggplot2 (local) FUN(X[[i]], ...)
  12. self$draw_panel(...)
  13. ggrepel (local) draw_panel(...)
  14. vctrs:::[<-.vctrs_vctr(*tmp*, is.infinite(xlim), value = <lgl>)
  15. vctrs::vec_cast(value, x)
  16. vctrs (local) <fn>()
  17. vctrs::vec_default_cast(...)
  18. vctrs:::vctr_cast(x, to, x_arg = x_arg, to_arg = to_arg, call = call)
  19. vctrs::vec_restore(x, to)
  20. vctrs (local) <fn>()
  21. vctrs:::vec_restore.vctrs_vctr(x = x, to = to, n = n)

Works for me:

R version 4.1.2 (2021-11-01)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 10 x64 (build 19042)

Matrix products: default

locale:
[1] LC_COLLATE=English_Australia.1252  LC_CTYPE=English_Australia.1252    LC_MONETARY=English_Australia.1252
[4] LC_NUMERIC=C                       LC_TIME=English_Australia.1252    

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] ggstatsplot_0.9.4

Perhaps raise an issue?

Issues · IndrajeetPatil/ggstatsplot (github.com)

Thanks WillaimL

I wonder if it's my version of the vctrs package? 0.4.2

Also I'm not alone. Seems to be a recent issue?

1 Like

This topic was automatically closed 42 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.