inst/shiny/modules/read.R

#' @rdname shiny_helper_functions
#' @export readUiInput
readUiInput <- function(){}


#' @rdname shiny_helper_functions
#' @export readUiOutput
readUiOutput <- function() uiOutput("read_fulltext")


#' @rdname shiny_helper_functions
#' @export readServer
readServer <- function(input, output, session){
  
}

Try the polmineR package in your browser

Any scripts or data that you put into this service are public.

polmineR documentation built on Nov. 2, 2023, 5:52 p.m.