Search code examples
rdplyrrlang

Adding dataset and column arguments into a function from a named vector -rlang question


I have a series of functions that make some ggplot2 charts.

I have a new dataset that I want to use these functions on, to make the charts.

This new dataset has its own unique names for the columns that the functions needs.

It is also likely that I will get additional new datasets (with their own different column names) in the future).

I was thinking of making a named vector where I specified the new dataset's column names to utilise (and also the name of the new dataset object itself), and I could give the values of this named vector to each of the functions.

Here is a minimally reproducible example for what I am talking about.

I know it is going to involve some combination of !!, enquo, sym... but I've tried heaps and it looks like it's got me beat.

Also, I would like to do this without altering the functions (i.e. I would still like to utilise the functions by entering in the dataset / column object names directly, as well).

library(tidyverse)
library(rlang)

# make a dataset
dif_data_name <- tibble(dif_col_name = 1:50)


# a function that only utilises a dataset
test_function_only_data <- function(dataset) {

  dataset %>% 
    pull() %>% 
    sum()
}

# a function that utilises the dataset and a specific column

test_function_with_col <- function(dataset, only_column) {

  only_column <- enquo(only_column)

  dataset %>% 
    pull(!! only_column) %>%
    sum()
}



# If I specify the datset object, this works
test_function_only_data(dif_data_name)

# so does this (with the column name as well)
test_function_with_col(dif_data_name, dif_col_name)


# But I was hoping to use a named vector for the dataset and column arguments

function_arguments <- c("dataset" = "dif_data_name",
                         "only_column" = "dif_col_name")


# These (below) do not work. But I would like to figure out how to make them work.


# first function test

test_function_only_data(
  function_arguments[["dataset"]]
                        )


# second function test

test_function_with_col(function_arguments[["dataset"]],  
                       function_arguments[["only_column"]])




Solution

  • Update (per OP comments)
    Here's a full example using the data posted in the gist in this comment thread.

    set.seed(123)
    
    new_table <- tibble(
      Date = seq.Date(as.Date("2016-01-01"), as.Date("2019-12-31"), 1)
      ) %>% 
      mutate(total_sales = rnorm(n()))
    
    new_yearly_lines_fn <- function(sales_table, date_col, money_col) {
      date_col <- sym(date_col)
      money_col <- sym(money_col)
      sales_table <- eval(sym(sales_table))
    
      sales_table %>%
        group_by(year_month = floor_date({{date_col}}, "months"),
                 year = year({{date_col}})) %>%
        summarise(total_sales = sum({{money_col}})) %>%
        ungroup() %>%
        ggplot() +
        aes(year_month, total_sales, col = factor(year)) +
        geom_line(stat = "identity", size = 2) +
        geom_point(stat = "identity", size = 2, col = "black")
    
    }
    
    function_arguments <- c("the_dataset" = "new_table",
                            "the_date_col" = "Date",
                            "the_money_col" = "total_sales")
    
    new_yearly_lines_fn(function_arguments[["the_dataset"]], 
                        function_arguments[["the_date_col"]], 
                        function_arguments[["the_money_col"]])
    

    enter image description here

    FWIW, there are simpler ways to pass the information you want into a function with tidy evaluation. But here's how you'd do it with your named vector:

    f <- function(named) {
      df_str <- named[["dataset"]]
      col_str <- named[["only_column"]]
    
      dataset <- eval(sym(df_str))
    
      dataset %>% 
        pull({{col_str}}) %>%
        sum()
    }
    
    f(function_arguments)
    # 1275
    

    Variants which pass in individual components of function_arguments will also work:

    f2 <- function(df_str, col_str) {
      col <- sym(col_str)
      dataset <- eval(sym(df_str))
    
      dataset %>% 
        pull({{col_str}}) %>%
        sum()
    }
    
    f2(function_arguments[["dataset"]], function_arguments[["only_column"]])
    # 1275 
    

    Note that !! notation is now replaced by {{ }} notation, as of rlang. 0.4.0.