R/updata_tab.r

Defines functions update_tab2 update_tab1

Documented in update_tab2

#' @include tab4_function.r
NULL


#'
update_tab1 <- function(tab0, tab1, information, manual_cp) {

  est_cutscore <- tab0$est_cs

  tab1$modal_est_cutscore_all <-
    estCutScore_mode_manual(est_cutscore, information, manual_cp)

  tab1$modal_est_cs_all <- map(tab1$modal_est_cutscore_all, ~ .x$est_cs)
  tab1$modal_est_cp_all <- map(tab1$modal_est_cutscore_all, ~ .x$est_cp)
  tab1$modal_selected_cp_all <- map(tab1$modal_est_cutscore_all, ~ .x$selected_CP)

  tab1$modal_res_all <-
    map2(tab1$modal_est_cs_all, tab1$modal_selected_cp_all,
         tab1_group_out_all, input$WESS, modal = T) %>%
    map(., ~.x$res) %>% bind_rows() %>%
    select(-OOD) %>%
    mutate(Table = "All", .after = GCA)

  tab1$modal_table_all <- gen_indi_table(tab1$modal_res_all)

  modal_est_cs <- tab1$modal_est_cs_all
  modal_est_cp <- tab1$modal_est_cp_all
  modal_selected_cp <- tab1$modal_selected_cp_all

  # est_cutscore <- modal_est_cs
  # target_filter <- information$base_data$target_nm

  # list(est_cutscore = est_cutscore,
  #      target_filter = target_filter)

  tab1

}

#'
update_tab2 <- function(tab1, information) {
  gen_tab2(tab1, information)
}
sooyongl/ESS documentation built on Dec. 23, 2021, 4:22 a.m.