Warning: file_get_contents(/data/phpspider/zhask/data//catemap/4/r/80.json): failed to open stream: No such file or directory in /data/phpspider/zhask/libs/function.php on line 167

Warning: Invalid argument supplied for foreach() in /data/phpspider/zhask/libs/tag.function.php on line 1116

Notice: Undefined index: in /data/phpspider/zhask/libs/function.php on line 180

Warning: array_chunk() expects parameter 1 to be array, null given in /data/phpspider/zhask/libs/function.php on line 181
R 根据文本框中的输入,将一些响应评分为1或0_R_Shiny_Shinydashboard_Shiny Server_Shinyapps - Fatal编程技术网

R 根据文本框中的输入,将一些响应评分为1或0

R 根据文本框中的输入,将一些响应评分为1或0,r,shiny,shinydashboard,shiny-server,shinyapps,R,Shiny,Shinydashboard,Shiny Server,Shinyapps,下面是我的应用程序,这是一个视频,解释了我想要什么。这是我的第一个应用程序,所以我很困惑我该如何制作它。我想将数据编码为1或0。数据将是MCQ问题的答案,如ABCD和我想将正确答案得分为1,将不正确答案得分为0 UI: library(shiny) library(DT) shinyUI( navbarPage(title="Analysis", tabPanel(title="Input",

下面是我的应用程序,这是一个视频,解释了我想要什么。这是我的第一个应用程序,所以我很困惑我该如何制作它。我想将数据编码为1或0。数据将是MCQ问题的答案,如ABCD和我想将正确答案得分为1,将不正确答案得分为0

UI:

 library(shiny)
library(DT)
shinyUI(
  navbarPage(title="Analysis",
             tabPanel(title="Input",
                      sidebarLayout(
                        sidebarPanel(
                          fileInput("file","Upload the file"),
                          checkboxInput('file_has_headers',"Take Column Names from the first row of the file",value= TRUE),
                          checkboxInput('show_head_only',"Display only first 6 rows. Uncheck this to see entire file",value= TRUE),
                          radioButtons(inputId = 'sep', label = 'Separator', choices = c(Comma=',',Semicolon=';',Tab='\t', Space=''), selected = ','),
                          textAreaInput("domains", 'Enter the comma seperated list of dimensions, for example: verbal ability, numerical ability' ),
                          width = 4
                        ),
                        mainPanel(
                          wellPanel(
                            DT::dataTableOutput("uploaded_table"
                            ),# Displays the uploaded table by using js dataTable from DT package
                          ),
                          width = 8
                        ),
                        position = 'left'
                      )      
             ), #End of Input Tab panel
             
             tabPanel(title="Verification",
                      
                    
                              fillCol(uiOutput('choose_columns')),
                             
                        ## end of fillRow
                      
             ), #End of Verification Tab Panel
             navbarMenu(title="Analayis",
                        tabPanel(title="Item Analysis", "content"
                                 
                        ), #End of Item Analysis Tab Panel
                        tabPanel(title="Test Analysis", "content"
                                 
                        ) #End of Test Analysis Tab Panel
             ) #End of navbarMenu
  ) #End of navbarPage
) #end of shinyUI
   library(shiny)
    library(DT)
    options(shiny.maxRequestSize=300*1024^2)
    shinyServer(function(input, output) {
      
  #1: Get the uploaded file in the data variable 
  data <- reactive({
    uploaded <- input$file
    #if(is.null(file1)){return("No file is selected or selected file is not in the right format. Please check the documentation and upload correct file.")} 
    req(uploaded) #req retruns a silence rather than error and is better than using if()
    if(input$show_head_only){
      head(read.csv(file=uploaded$datapath, sep=input$sep,header = input$file_has_headers)) #head() returns only first 6 rows
    } else {
      read.csv(file=uploaded$datapath, sep=input$sep,header = input$file_has_headers) 
    }
  })
  
  #3: set element to show the uploaded csv file as a table
  output$uploaded_table<- DT::renderDataTable(
    data(), # If a variable contains the output of reactive() function, it must be used as a function.
    server=TRUE, #Important to keep this as true so that large datasets do not crash the browser
    options = list(
      scrollX = TRUE
    ),
  ) # End of uploaded table output setting
  
  #4: Set dynamic checkboxes based on the number of columns in the data
  output$choose_columns <- renderUI({
    n <- length(names(data()))
    colnames <- names(data())
    items <- strsplit(input$domains,',')[[1]]
    tagList(
      lapply(1:n, function(i){
       
          
          div(
            div(style="display: inline-block; vertical-align:top; width: 150px ;",checkboxInput(paste0('Columns', i),"", value = TRUE )),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",textInput(paste0('answer_key', i),"",placeholder = 'e.g. A')),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",selectInput(inputId = "domains", label = "", choices =  items)),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",textInput(paste0('valid_options',i),"",placeholder = 'e.g. A,B,C,D'))
          )
          
          
        
    
  })
  

  
      )
    
  })
  
})
服务器:

 library(shiny)
library(DT)
shinyUI(
  navbarPage(title="Analysis",
             tabPanel(title="Input",
                      sidebarLayout(
                        sidebarPanel(
                          fileInput("file","Upload the file"),
                          checkboxInput('file_has_headers',"Take Column Names from the first row of the file",value= TRUE),
                          checkboxInput('show_head_only',"Display only first 6 rows. Uncheck this to see entire file",value= TRUE),
                          radioButtons(inputId = 'sep', label = 'Separator', choices = c(Comma=',',Semicolon=';',Tab='\t', Space=''), selected = ','),
                          textAreaInput("domains", 'Enter the comma seperated list of dimensions, for example: verbal ability, numerical ability' ),
                          width = 4
                        ),
                        mainPanel(
                          wellPanel(
                            DT::dataTableOutput("uploaded_table"
                            ),# Displays the uploaded table by using js dataTable from DT package
                          ),
                          width = 8
                        ),
                        position = 'left'
                      )      
             ), #End of Input Tab panel
             
             tabPanel(title="Verification",
                      
                    
                              fillCol(uiOutput('choose_columns')),
                             
                        ## end of fillRow
                      
             ), #End of Verification Tab Panel
             navbarMenu(title="Analayis",
                        tabPanel(title="Item Analysis", "content"
                                 
                        ), #End of Item Analysis Tab Panel
                        tabPanel(title="Test Analysis", "content"
                                 
                        ) #End of Test Analysis Tab Panel
             ) #End of navbarMenu
  ) #End of navbarPage
) #end of shinyUI
   library(shiny)
    library(DT)
    options(shiny.maxRequestSize=300*1024^2)
    shinyServer(function(input, output) {
      
  #1: Get the uploaded file in the data variable 
  data <- reactive({
    uploaded <- input$file
    #if(is.null(file1)){return("No file is selected or selected file is not in the right format. Please check the documentation and upload correct file.")} 
    req(uploaded) #req retruns a silence rather than error and is better than using if()
    if(input$show_head_only){
      head(read.csv(file=uploaded$datapath, sep=input$sep,header = input$file_has_headers)) #head() returns only first 6 rows
    } else {
      read.csv(file=uploaded$datapath, sep=input$sep,header = input$file_has_headers) 
    }
  })
  
  #3: set element to show the uploaded csv file as a table
  output$uploaded_table<- DT::renderDataTable(
    data(), # If a variable contains the output of reactive() function, it must be used as a function.
    server=TRUE, #Important to keep this as true so that large datasets do not crash the browser
    options = list(
      scrollX = TRUE
    ),
  ) # End of uploaded table output setting
  
  #4: Set dynamic checkboxes based on the number of columns in the data
  output$choose_columns <- renderUI({
    n <- length(names(data()))
    colnames <- names(data())
    items <- strsplit(input$domains,',')[[1]]
    tagList(
      lapply(1:n, function(i){
       
          
          div(
            div(style="display: inline-block; vertical-align:top; width: 150px ;",checkboxInput(paste0('Columns', i),"", value = TRUE )),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",textInput(paste0('answer_key', i),"",placeholder = 'e.g. A')),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",selectInput(inputId = "domains", label = "", choices =  items)),
            div(style="display: inline-block; vertical-align:top; width: 150px ;",textInput(paste0('valid_options',i),"",placeholder = 'e.g. A,B,C,D'))
          )
          
          
        
    
  })
  

  
      )
    
  })
  
})
库(闪亮)
图书馆(DT)
选项(Shining.maxRequestSize=300*1024^2)
shinyServer(功能(输入、输出){
#1:在数据变量中获取上传的文件
数据