We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
vec_proxy_compare()
1 parent 4a69d71 commit a672f8cCopy full SHA for a672f8c
R/compare.R
@@ -49,6 +49,10 @@
49
#' vec_sort(df)
50
vec_proxy_compare <- function(x, ...) {
51
if (!missing(...)) {
52
+ # For backward compatibility with older dplyr versions
53
+ if (match_relax(...)) {
54
+ return(vec_proxy_order(x))
55
+ }
56
ellipsis::check_dots_empty()
57
}
58
return(.Call(vctrs_proxy_compare, x))
@@ -59,6 +63,10 @@ vec_proxy_compare.default <- function(x, ...) {
59
63
stop_native_implementation("vec_proxy_compare.default")
60
64
61
65
66
+match_relax <- function(..., relax = FALSE) {
67
+ relax
68
+}
69
+
62
70
#' @rdname vec_proxy_compare
71
#' @export
72
vec_proxy_order <- function(x, ...) {
0 commit comments