library(ggplot2)
library(tibble)
df <- tibble(y = as.POSIXct("2018-01-01 00:00:00", tz = "UTC"), x = 110)
df %>%
ggplot(aes(x)) +
geom_histogram() +
facet_wrap(~y)
#> Error: `scale_id` must not be `NA`
df <- tibble(y = as.POSIXct("2018-01-01 00:00:00"), x = 110)
df %>%
ggplot(aes(x)) +
geom_histogram() +
facet_wrap(~y)
#> `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Created on 2021-02-05 by the reprex package (v1.0.0)