Skip to content

Commit

Permalink
Avoid ggplot2 3.5 deprecation warnings
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed Nov 29, 2024
1 parent cbdecc1 commit 0a410a5
Show file tree
Hide file tree
Showing 3 changed files with 6 additions and 4 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -54,7 +54,7 @@ Suggests:
data.table,
duckdb,
ggforce,
ggplot2,
ggplot2 (>= 3.5.0),
jsonlite,
log4r,
lubridate,
Expand Down
3 changes: 2 additions & 1 deletion R/scan_data.R
Original file line number Diff line number Diff line change
Expand Up @@ -1446,7 +1446,8 @@ get_corr_plot <- function(
panel.grid = ggplot2::element_blank(),
legend.direction = "horizontal",
legend.title = ggplot2::element_blank(),
legend.position = c(0.5, 1.03),
legend.position = "inside",
legend.position.inside = c(0.5, 1.03),
plot.margin = ggplot2::unit(c(1, 0.5, 0, 0), "cm"),
legend.key.width = ggplot2::unit(2.0, "cm"),
legend.key.height = ggplot2::unit(3.0, "mm")
Expand Down
5 changes: 3 additions & 2 deletions R/utils-profiling.R
Original file line number Diff line number Diff line change
Expand Up @@ -339,7 +339,7 @@ get_table_column_histogram <- function(data_column, lang, locale) {
ggplot2::geom_col(fill = "steelblue", width = 0.5) +
ggplot2::geom_hline(yintercept = 0, color = "#B2B2B2") +
ggplot2::labs(x = x_label, y = y_label) +
ggplot2::scale_y_continuous(labels = scales::comma_format()) +
ggplot2::scale_y_continuous(labels = scales::label_comma()) +
ggplot2::theme_minimal()
)
}
Expand Down Expand Up @@ -606,7 +606,8 @@ get_missing_value_plot <- function(data, frequency_tbl, missing_by_column_tbl) {
panel.grid = ggplot2::element_blank(),
legend.direction = "horizontal",
legend.title = ggplot2::element_blank(),
legend.position = c(0.5, 1.0),
legend.position = "inside",
legend.position.inside = c(0.5, 1.0),
plot.margin = ggplot2::unit(c(1, 0.5, 0, 0), "cm"),
legend.key.width = ggplot2::unit(2.0, "cm"),
legend.key.height = ggplot2::unit(3.0, "mm")
Expand Down

0 comments on commit 0a410a5

Please sign in to comment.