Skip to content

Tests in pillar fail with the dev version of ggplot2 #6361

Closed
r-lib/pillar
#729
@krlmlr

Description

@krlmlr

Is this us? Should ggplot2 do things differently? Should we investigate further?

This is with the dev version of ggplot2.

library(pillar)

data <- tibble::tibble(
  x = num((1:10) / 100, fixed_exponent = -3, notation = "eng"),
  y = num((1:10) / 100, scale = 100, label = "%"),
  z = num(10^(-5:4), notation = "si")
)

basic <-
  ggplot2::ggplot(data, ggplot2::aes(x, y)) +
  ggplot2::geom_point() +
  ggplot2::theme_minimal(36)

basic
#> Error in make_title(..., self = self): unused arguments (list(), "x")

log_scale <-
  ggplot2::ggplot(data, ggplot2::aes(x, z)) +
  ggplot2::geom_point() +
  scale_y_num(transform = "log10") +
  ggplot2::theme_minimal(36)

log_scale
#> Error in make_title(..., self = self): unused arguments (list(), "x")

Created on 2025-03-13 with reprex v2.1.1

Metadata

Metadata

Assignees

No one assigned

    Labels

    bugan unexpected problem or unintended behaviorscales 🐍

    Type

    No type

    Projects

    No projects

    Milestone

    No milestone

    Relationships

    None yet

    Development

    No branches or pull requests

    Issue actions