Search code examples
rdplyrrlangtidyselect

Issue with selecting negative values in dplyr with embrace {{ arg }}


I have an issue with selecting negative columns based on a variable. I found a similar issue reported here: https://github.com/tidyverse/dplyr/issues/4813 but the provided solution does not work (see repex below). If anyone knows a workaround, that would be very appreciated!! Here is a repex of the issue:

# 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.

Created on 2021-06-21 by the reprex package (v2.0.0)


Solution

  • Is this what you are looking for?

    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
    

    Created on 2021-06-21 by the reprex package (v0.3.0)

    If you don't mind having the default value inside the functions formals, then the approach below works as well:

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

    If you want to capture -1 in a vector and use it inside dplyr::select or one of your own functions you should capture it with minus_one <- expr(-1). Then it won't throw an error.

    minus_one <- expr(-1)
    
    ex_data %>% 
      my_select_bang(minus_one)
    
    #> # A tibble: 1 x 1
    #>       b
    #>   <dbl>
    #> 1     2
    

    Created on 2021-06-21 by the reprex package (v0.3.0)