Skip to content

Commit

Permalink
Simplify message
Browse files Browse the repository at this point in the history
  • Loading branch information
DavisVaughan committed Nov 6, 2023
1 parent 2031f6f commit 4ce038f
Show file tree
Hide file tree
Showing 2 changed files with 6 additions and 10 deletions.
12 changes: 5 additions & 7 deletions R/join-rows.R
Original file line number Diff line number Diff line change
Expand Up @@ -146,16 +146,14 @@ rethrow_error_join_matches_overflow <- function(cnd, call) {
stop_join(
message = c(
"This join would result in more rows than dplyr can handle.",
i = glue("{size} rows would be returned."),
i = "2147483647 is the maximum number of rows allowed.",
i = glue(
"{size} rows would be returned. ",
"2147483647 rows is the maximum number allowed."
),
i = paste0(
"Double check your join keys. This error commonly occurs due to a ",
"missing join key, or an improperly specified join condition."
),
i = cli::format_inline(paste0(
"If you believe this is an error in dplyr, ",
"please report it at {.url https://github.com/tidyverse/dplyr/issues}."
))
)
),
class = "dplyr_error_join_matches_overflow",
call = call
Expand Down
4 changes: 1 addition & 3 deletions tests/testthat/_snaps/join-rows.md
Original file line number Diff line number Diff line change
Expand Up @@ -351,10 +351,8 @@
Condition
Error:
! This join would result in more rows than dplyr can handle.
i 50000005000000 rows would be returned.
i 2147483647 is the maximum number of rows allowed.
i 50000005000000 rows would be returned. 2147483647 rows is the maximum number allowed.
i Double check your join keys. This error commonly occurs due to a missing join key, or an improperly specified join condition.
i If you believe this is an error in dplyr, please report it at <https://github.com/tidyverse/dplyr/issues>.

# `multiple = NULL` is deprecated and results in `'all'` (#6731)

Expand Down

0 comments on commit 4ce038f

Please sign in to comment.