2

我在根据变量选择负列时遇到问题。我在这里发现了一个类似的问题: https ://github.com/tidyverse/dplyr/issues/4813但提供的解决方案不起作用(见repex下文)。如果有人知道解决方法,那将不胜感激!这是一个repex问题:

# Load package
library(dplyr, warn.conflicts = F)
ex_data <- tibble(a = 1, b = 2)

# example functions
## Function for checking if target was provided
## else defaults to all numeric columns
check_target <- function(target) {
  target
  target_quoted <- rlang::enquo(target)
  if (rlang::quo_is_null(target_quoted)) {
    rlang::expr(where(is.numeric))
  } else{
    rlang::expr(!!target)
  }
}
## Just soft wrappers to show how the preivews
## function could be used
my_select_embrace <- function(data, target = NULL){
  target <- check_target(target)
  data %>% 
    select({{ target }})
}
my_select_bang <- function(data, target = NULL){
  target <- check_target(target)
  data %>% 
    select(!!target)
}
# Works
ex_data %>% 
  select(-1) %>%
  invisible()
ex_data %>% 
  my_select_bang(tidyselect::vars_select_helpers$where(is.numeric)) %>%
  invisible()
ex_data %>% 
  my_select_bang() %>%
  invisible()
# Fails
ex_data %>% 
  my_select_embrace() %>%
  invisible()
#> Error: object 'is.numeric' not found
ex_data %>% 
  my_select_bang(tidyselect::vars_select_helpers$contains('a')) %>%
  invisible()
#> Error: `contains()` must be used within a *selecting* function.
#> i See <https://tidyselect.r-lib.org/reference/faq-selection-context.html>.
ex_data %>% 
  my_select_embrace(tidyselect::vars_select_helpers$where(is.numeric)) %>%
  invisible()
minus_one <- -1
ex_data %>% 
  my_select_embrace(minus_one)
#> Error: Selections can't have negative values.
ex_data %>% 
  my_select_bang(minus_one)
#> Error: Selections can't have negative values.

reprex 包于 2021-06-21 创建 (v2.0.0 )

4

2 回答 2

1

这是你想要的?

library(dplyr, warn.conflicts = F)
ex_data <- tibble(a = 1, b = 2)


my_select_bang <- function(data, target = NULL){
  
  target_quoted <- enquo(target)
  target_null <- rlang::quo_is_null(target_quoted)

  data %>% 
    select(if (target_null) where(is.numeric) else !!target_quoted)
}

# defaults to `where(is.numeric)`
ex_data %>% 
  my_select_bang()
#> # A tibble: 1 x 2
#>       a     b
#>   <dbl> <dbl>
#> 1     1     2

# works with tidyselect syntax as expected
ex_data %>% 
  my_select_bang(contains("a"))
#> # A tibble: 1 x 1
#>       a
#>   <dbl>
#> 1     1

reprex 包(v0.3.0)于 2021-06-21 创建

如果您不介意在函数形式中使用默认值,那么下面的方法也可以:

my_select_bang <- function(data,
                           target = tidyselect::vars_select_helpers$where(is.numeric)){
  
  data %>% 
    select(!!target)
}

如果您想-1在向量中捕获并在内部dplyr::select或您自己的函数之一中使用它,您应该使用minus_one <- expr(-1). 然后它不会抛出错误。

minus_one <- expr(-1)

ex_data %>% 
  my_select_bang(minus_one)

#> # A tibble: 1 x 1
#>       b
#>   <dbl>
#> 1     2

reprex 包(v0.3.0)于 2021-06-21 创建

于 2021-06-21T20:42:25.843 回答
0

使原始设计工作的一种方法是target在将其发送到check_target并使用bang-bang( !!) 之前引用 () 而不是拥抱{{ arg }}

# Load package
library(dplyr, warn.conflicts = F)
ex_data <- tibble(a = 1, b = 2)

# example functions
## Function for checking if target was provided
## else defaults to all numeric columns
check_target <- function(target) {
  if (rlang::quo_is_null(target)) {
    rlang::expr(where(is.numeric))
  } else{
    target
  }
}
## Just soft wrapper to show how the preivews
## function could be used
my_select_bang <- function(data, target = NULL){
  target <- rlang::enquo(target)
  target <- check_target(target)
  data %>% 
    select(!!target)
}
# Works
ex_data %>% 
  select(-1) %>%
  invisible()
ex_data %>% 
  select(contains('a')) %>%
  invisible()
ex_data %>% 
  my_select_bang(where(is.numeric)) %>%
  invisible()
ex_data %>% 
  my_select_bang() %>%
  invisible()
ex_data %>% 
  my_select_bang(contains('a')) %>%
  invisible()
ex_data %>% 
  my_select_bang(-1) %>%
  invisible()

reprex 包于 2021-06-21 创建 (v2.0.0 )

于 2021-06-21T21:19:01.497 回答