hi
I have a code that read many csv file's and when run it and call my variable get this error object 'merge_data' not found
.
Rstudio version is : 1.4
merge_data <- list.files(path = path,
pattern = "\\.csv$",
full.names = TRUE) %>%
set_names() %>%
map_dfr(read_csv, .id = "file_name") %>%
mutate(file_name = basename(file_name),
symbol = str_remove(file_name, ".csv")) %>%
type_convert() %>%
select(-1) %>%
relocate(symbol, jdate) %>%
distinct()