Comrades! Greetings. Please help me out ... there is some significant misunderstanding.
Suppose I created like this data.frame:
df<-data.frame(num = c(1:250),
           app_num =  sample(1:100, 250, replace=T),
           entrance=sample(1:4, 250, replace=T),
           gender=sample(c('m','f'), 250,replace=T),
           age= sample(1:100, 250, replace=T))
I save it in the "*csv" format, using the command:
write.csv2(data_file,file = file.choose(new = T), row.names = FALSE, quote = FALSE)
O.K. Now I want to create a shiny-application for displaying and working with this data like his:
    library("shiny")
    #to work with extra string functions
    library("stringr") 
    library("data.table") 
    library("readr")
    # Define UI for application that draws a histogram
    ui <- fluidPage(
      titlePanel(h2(strong("Analysis of the composition and structure of residents"),
                 align = "center")),
      fileInput(
        inputId="fileInput",
        label="Choose file",
        multiple = FALSE,
        accept = ".csv",
        width = '100%',
        buttonLabel = "Choosing ...",
        placeholder = "No files selected yet"
      ),
      sidebarPanel(
        checkboxGroupInput(inputId="gender", label = "Choosing a gender feature:",
          choices = c("Men" = "m",
                      "Women" = "f"),
          selected= c("Men" = "m",
                      "Women" = "f")),
        sliderInput(inputId = "age", label = "Indicate the age group:",
                    min = 1, max = 100, value = c(1, 100)),
        selectInput(
          inputId = "group",
          label="Indicate the entrance",
          choices=c(1:4),
          selected = c(1:4),
          multiple = TRUE,
          selectize = TRUE,
          width = NULL,
          size = NULL
        )
      ),
      mainPanel(
        navbarPage("",
          tabPanel("Сommon data",
            textOutput(outputId = "text1"),
            ),
          tabPanel("Results table",
                   dataTableOutput(outputId = "content")
            ),
          tabPanel("Graphic data")
        )
      )
    )
    # Define server logic required to draw a histogram
    server <- function(input, output) {
      fileinfor <- reactiveValues(file=NULL,
                                 ext=NULL,
                                 datapath=NULL)
      
      output$content <- renderDataTable({
        fileinfor$file <- input$fileInput
        fileinfor$datapath<-fileinfor$file$datapath
        fileinfor.datapath <- fileinfor$file$datapath
        fileinfor$ext <- tools::file_ext(fileinfor$datapath)
        req(fileinfor$file)
        validate(need(fileinfor$ext== "csv", "Please upload a csv file"))
        fread(fileinfor$datapath,
              showProgress = FALSE,
              sep=";", quote="",header=TRUE)
      })
      output$text1 <- renderUI(renderText({ 
        paste("Check ", fileinfor$datapath)
        }))
      
    }
    # Run the application 
    shinyApp(ui = ui, server = server)
On the server side, I have several questions:
- How to get the data correctly so that you can create a variable based on it and use it several times. On the example of my code, you can see that the server-side code block below no longer sees the created variable: - output $ text1 <- renderUI (renderText ({ paste ("Check", fileinfor $ datapath) })) 
- Could you show by my example the creation of manipulated variables and their application? Can't figure out where and how to move? 
