diff --git a/DESCRIPTION b/DESCRIPTION index a951fca..b3a0612 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -15,9 +15,9 @@ Imports: dplyr, glue, gtsummary, - haven, here, quarto, + haven, readODS, readr, shiny, @@ -29,17 +29,14 @@ Imports: parameters, DT, performance, - ggiraph, qqplotr, see, patchwork, easystats, DHARMa, IDEAFilter, - sparkline, datamods, toastui, - webshot, lubridate, bsicons, thematic, @@ -48,18 +45,11 @@ Imports: classInt, htmltools, rlang, - data.table, apexcharter, esquisse, - janitor, flextable, gt, - kableExtra, rankinPlot, - sjPlot, - gvlma, - psych, - jtools, Hmisc, ggstats, rempsyc, @@ -74,6 +64,7 @@ Suggests: styler, devtools, rhub, + webshot, usethis, roxygen2, pak, @@ -87,3 +78,6 @@ URL: https://github.com/agdamsbo/FreesearchR, https://agdamsbo.github.io/Freesea BugReports: https://github.com/agdamsbo/FreesearchR/issues VignetteBuilder: knitr Config/testthat/edition: 3 +Depends: + R (>= 3.5) +LazyData: true diff --git a/R/data_plots.R b/R/data_plots.R index 55856ca..d93b0ea 100644 --- a/R/data_plots.R +++ b/R/data_plots.R @@ -695,7 +695,7 @@ line_break <- function(data, lineLength = 20, force = FALSE) { #' @export #' wrap_plot_list <- function(data, tag_levels = NULL) { - if (ggplot2::is.ggplot(data[[1]])) { + if (ggplot2::is_ggplot(data[[1]])) { if (length(data) > 1) { out <- data |> (\(.x){ @@ -732,7 +732,7 @@ wrap_plot_list <- function(data, tag_levels = NULL) { align_axes <- function(...) { # https://stackoverflow.com/questions/62818776/get-axis-limits-from-ggplot-object # https://github.com/thomasp85/patchwork/blob/main/R/plot_multipage.R#L150 - if (ggplot2::is.ggplot(..1)) { + if (ggplot2::is_ggplot(..1)) { ## Assumes list of ggplots p <- list(...) } else if (is.list(..1)) { diff --git a/R/helpers.R b/R/helpers.R index aed6b82..e9f8394 100644 --- a/R/helpers.R +++ b/R/helpers.R @@ -87,7 +87,7 @@ read_input <- function(file, consider.na = c("NA", '""', "")) { if (ext == "csv") { df <- readr::read_csv(file = file, na = consider.na) } else if (ext %in% c("xls", "xlsx")) { - df <- openxlsx2::read_xlsx(file = file, na.strings = consider.na) + df <- readxl::read_excel(file = file, na.strings = consider.na) } else if (ext == "dta") { df <- haven::read_dta(file = file) } else if (ext == "ods") { @@ -428,7 +428,7 @@ sort_by <- function(x, y, na.rm = FALSE, ...) { get_ggplot_label <- function(data, label) { - assertthat::assert_that(ggplot2::is.ggplot(data)) + assertthat::assert_that(ggplot2::is_ggplot(data)) data$labels[[label]] } diff --git a/R/import-file-ext.R b/R/import-file-ext.R index 4c3d77b..5298ec4 100644 --- a/R/import-file-ext.R +++ b/R/import-file-ext.R @@ -242,7 +242,7 @@ import_file_server <- function(id, req(input$file) if (!all(input$sheet %in% temporary_rv$sheets)) { - sheets <- 1 + sheets <- 1 } else { sheets <- input$sheet } @@ -298,31 +298,33 @@ import_file_server <- function(id, ) observeEvent(input$see_data, { - tryCatch({ - datamods:::show_data(default_parsing(temporary_rv$data), title = datamods:::i18n("Imported data"), type = show_data_in) - }, - # warning = function(warn) { - # showNotification(warn, type = "warning") - # }, - error = function(err) { - showNotification(err, type = "err") - } + tryCatch( + { + datamods:::show_data(default_parsing(temporary_rv$data), title = datamods:::i18n("Imported data"), type = show_data_in) + }, + # warning = function(warn) { + # showNotification(warn, type = "warning") + # }, + error = function(err) { + showNotification(err, type = "err") + } ) }) output$table <- toastui::renderDatagrid2({ req(temporary_rv$data) - tryCatch({ - toastui::datagrid( - data = setNames(head(temporary_rv$data, 5),make.names(names(temporary_rv$data),unique = TRUE)), - theme = "striped", - colwidths = "guess", - minBodyHeight = 250 - ) - }, - error = function(err) { - showNotification(err, type = "err") - } + tryCatch( + { + toastui::datagrid( + data = setNames(head(temporary_rv$data, 5), make.names(names(temporary_rv$data), unique = TRUE)), + theme = "striped", + colwidths = "guess", + minBodyHeight = 250 + ) + }, + error = function(err) { + showNotification(err, type = "err") + } ) }) @@ -418,13 +420,22 @@ import_xls <- function(file, sheet, skip, na.strings) { sheet |> purrr::map(\(.x){ - openxlsx2::read_xlsx( - file = file, + readxl::read_excel( + path = file, sheet = .x, - skip_empty_rows = TRUE, - start_row = skip - 1, - na.strings = na.strings + na = na.strings, + skip = skip, + .name_repair = "unique_quiet", + trim_ws = TRUE ) + + # openxlsx2::read_xlsx( + # file = file, + # sheet = .x, + # skip_empty_rows = TRUE, + # start_row = skip - 1, + # na.strings = na.strings + # ) }) |> purrr::reduce(dplyr::full_join) },