Compare commits

...

3 Commits

4 changed files with 63 additions and 29 deletions

View File

@ -219,12 +219,20 @@ apply_field_label <- function(data,meta){
#' @return data.frame #' @return data.frame
#' @export #' @export
#' #'
apply_factor_labels <- function(data,meta){ apply_factor_labels <- function(data,meta=NULL){
if (is.list(data) && !is.data.frame(data)){
meta <- data$meta
data <- data$data
} else if (is.null(meta)) {
stop("Please provide a data frame for meta")
}
purrr::imap(data, \(.x, .i){ purrr::imap(data, \(.x, .i){
if (any(c("radio", "dropdown") %in% meta$field_type[meta$field_name == .i])) { if (any(c("radio", "dropdown") %in% meta$field_type[meta$field_name == .i]) || is.factor(.x)) {
format_redcap_factor(.x, meta$select_choices_or_calculations[meta$field_name == .i]) format_redcap_factor(.x, meta$select_choices_or_calculations[meta$field_name == .i])
} else { } else {
.x .x
} }
}) |> dplyr::bind_cols() }) |> dplyr::bind_cols()
} }

View File

@ -50,6 +50,14 @@ server <- function(input, output, session) {
) )
} }
if (input$factorize == "yes") {
out <- out |>
(\(.x){
suppressWarnings(
numchar2fct(.x)
)
})()
}
out out
}) })
@ -77,16 +85,6 @@ server <- function(input, output, session) {
) )
}) })
output$uploaded <- shiny::reactive({
if (is.null(v$file)) {
"no"
} else {
"yes"
}
})
shiny::outputOptions(output, "uploaded", suspendWhenHidden = FALSE)
output$factor_vars <- shiny::renderUI({ output$factor_vars <- shiny::renderUI({
shiny::req(input$ds) shiny::req(input$ds)
selectizeInput( selectizeInput(
@ -176,17 +174,31 @@ server <- function(input, output, session) {
shiny::req(input$api) shiny::req(input$api)
output_staging$data <- REDCapR::redcap_write( output_staging$data <- dd() |>
ds = purrr::pluck(dd(), "data"), apply_factor_labels() |>
redcap_uri = input$uri, REDCapR::redcap_write(
token = input$api redcap_uri = input$uri,
) |> purrr::pluck("success") token = input$api
) |>
purrr::pluck("success")
} }
output$upload.meta.print <- renderText(output_staging$meta) output$upload.meta.print <- renderText(output_staging$meta)
output$upload.data.print <- renderText(output_staging$data) output$upload.data.print <- renderText(output_staging$data)
output$uploaded <- shiny::reactive({
if (is.null(v$file)) {
"no"
} else {
"yes"
}
})
shiny::outputOptions(output, "uploaded", suspendWhenHidden = FALSE)
output$data.load <- shiny::renderText(expr = nrow(dat()))
# session$onSessionEnded(function() { # session$onSessionEnded(function() {
# # cat("Session Ended\n") # # cat("Session Ended\n")
# unlink("www",recursive = TRUE) # unlink("www",recursive = TRUE)
@ -237,14 +249,24 @@ ui <-
"No ID" = "none" "No ID" = "none"
) )
), ),
shiny::radioButtons(
inputId = "factorize",
label = "Factorize variables with few levels?",
selected = "yes",
inline = TRUE,
choices = list(
"Yes" = "yes",
"No" = "no"
)
),
shiny::radioButtons( shiny::radioButtons(
inputId = "specify_factors", inputId = "specify_factors",
label = "Specify categorical variables?", label = "Specify categorical variables?",
selected = "no", selected = "no",
inline = TRUE, inline = TRUE,
choices = list( choices = list(
"No" = "no", "Yes" = "yes",
"Yes" = "yes" "No" = "no"
) )
), ),
shiny::conditionalPanel( shiny::conditionalPanel(
@ -254,25 +276,27 @@ ui <-
# condition = "input.load_data", # condition = "input.load_data",
# shiny::helpText("Below you can download the dataset formatted for upload and the # shiny::helpText("Below you can download the dataset formatted for upload and the
# corresponding data dictionary for a new data base, if you want to upload manually."), # corresponding data dictionary for a new data base, if you want to upload manually."),
shiny::tags$hr(),
shiny::h4("Download data for manual upload"),
shiny::helpText("Look further down for direct upload option"),
# Button # Button
shiny::downloadButton(outputId = "downloadData", label = "Download renamed data"), shiny::downloadButton(outputId = "downloadData", label = "Download renamed data"),
shiny::em("and then"),
# Button # Button
shiny::downloadButton(outputId = "downloadMeta", label = "Download data dictionary"), shiny::downloadButton(outputId = "downloadMeta", label = "Download data dictionary"),
shiny::em("or"),
# Button
shiny::downloadButton(outputId = "downloadInstrument", label = "Download as instrument"), shiny::downloadButton(outputId = "downloadInstrument", label = "Download as instrument"),
# Horizontal line ---- # Horizontal line ----
shiny::tags$hr(), shiny::tags$hr(),
shiny::radioButtons( shiny::radioButtons(
inputId = "upload_redcap", inputId = "upload_redcap",
label = "Upload directly to REDCap server?", label = "Upload directly to a REDCap server?",
selected = "no", selected = "no",
inline = TRUE, inline = TRUE,
choices = list( choices = list(
"No" = "no", "Yes" = "yes",
"Yes" = "yes" "No" = "no"
) )
), ),
shiny::conditionalPanel( shiny::conditionalPanel(
@ -315,7 +339,8 @@ ui <-
bslib::nav_panel( bslib::nav_panel(
title = "Intro", title = "Intro",
shiny::markdown(readLines("www/SHINYCAST.md")), shiny::markdown(readLines("www/SHINYCAST.md")),
shiny::br() shiny::br(),
shiny::textOutput(outputId = "data.load")
), ),
# bslib::nav_spacer(), # bslib::nav_spacer(),
bslib::nav_panel( bslib::nav_panel(

View File

@ -4,7 +4,7 @@
\alias{apply_factor_labels} \alias{apply_factor_labels}
\title{Preserve all factor levels from REDCap data dictionary in data export} \title{Preserve all factor levels from REDCap data dictionary in data export}
\usage{ \usage{
apply_factor_labels(data, meta) apply_factor_labels(data, meta = NULL)
} }
\arguments{ \arguments{
\item{data}{REDCap exported data set} \item{data}{REDCap exported data set}

View File

@ -110,7 +110,8 @@ wide_data_suffixes <- wide_data |> suffix2label()
## Creating a nice table ## Creating a nice table
```{r} ```{r}
wide_data_suffixes |> wide_data_suffixes |>
as_factor()|>
dplyr::select(sex, hypertension, diabetes,mrs_score____follow2) |> dplyr::select(sex, hypertension, diabetes,mrs_score____follow2) |>
gtsummary::tbl_summary() gtsummary::tbl_summary(type = gtsummary::all_dichotomous() ~ "categorical")
``` ```