Skip to content

Commit

Permalink
Merge pull request #503 from yjunechoe/info_columns-where
Browse files Browse the repository at this point in the history
columns resolved against full data when available
  • Loading branch information
yjunechoe committed Nov 5, 2023
2 parents 0ff5eb2 + f327e72 commit d2ad537
Showing 1 changed file with 6 additions and 2 deletions.
8 changes: 6 additions & 2 deletions R/info_add.R
Original file line number Diff line number Diff line change
Expand Up @@ -449,10 +449,14 @@ info_columns <- function(
metadata_list <- metadata$metadata
metadata_columns <- metadata_list$columns

x <- dplyr::as_tibble(metadata_columns %>% lapply(function(x) 1))
if (is.null(x$tbl)) {
tbl <- dplyr::as_tibble(metadata_columns %>% lapply(function(x) 1))
} else {
tbl <- x$tbl
}

# Resolve the columns based on the expression
columns <- resolve_columns(x = x, var_expr = columns, preconditions = NULL)
columns <- resolve_columns(x = tbl, var_expr = columns)

if (length(columns) == 1 && is.na(columns)) {

Expand Down

0 comments on commit d2ad537

Please sign in to comment.