[SOLVED] CS代考 library(shinyjs)

30 $

File Name: CS代考_library(shinyjs).zip
File Size: 235.5 KB

SKU: 3412696004 Category: Tags: , , , , , , , , , , , , , , , , , , , , , , , , , , , , , , , ,

Or Upload Your Assignment Here:


library(shinyjs)

# load CSV file
f_testAnswer = read.csv(“test_answer.csv”)

Copyright By PowCoder代写加微信 assignmentchef

f_testQuestion = read.csv(“test_question.csv”)
f_test= read.csv(“test.csv”)
f_domain = read.csv(“Domain.csv”)

colnames(f_domain)[1] <- “Test”colnames(f_test)[1] <- “Test”colnames(f_testAnswer)[1] <- “Test”colnames(f_testQuestion)[1] <- “Test”testQA <- merge(f_testQuestion,f_testAnswer,all.X= T, all.Y = T)# define some reusable functions#—————-func 0—————–# a query to select between testget_test<- function(num){testQA[testQA$Test == num, ]#—————————————# —————func 1—————–# get questions for selected testget_questions <- function(test_df,num){paste(test_df$Question[num],”.”,test_df$Problem[num])# ————————————–# —————func 2—————–# get answers for selected testget_answers<- function(test_df, num){rowVal = as.list(test_df[num,])for (i in 5:length(rowVal)) {if(rowVal[i] != “”){out <- c(out,as.character(rowVal[i]))# ————————————–# —————func 3—————–# to random select answers and record the right oneshuffle_answers <- function(test_df){correct_answer = c()for (i in 1:nrow(test_df)) {r = test_df[i, -c(1:4)]answers = r[r != “”]num_valid_answer = length(answers)s = sample(num_valid_answer)correct_answer <- c(correct_answer, which(s == 1))test_df[i, c(5:(4 + num_valid_answer))] = answers[s]foo <- vector(“list”, length = 2)names(foo) <- c(“test_df”, “correctAnswer”)foo$test_df = test_dffoo$correctAnswer = correct_answer# ————————————–# —————func 4—————–# get correct answerget_correct_answer <- function(correctAnswer, num){correctAnswer[testQA$Test == num]# ————————————–# —————func 5—————–# after record all the answers, generate the domain gradedomainGrade <- function(domainList, answerList){c = rep(0,max(domainList)) # [0 for _ in range(max(domainList))]d = rep(0,max(domainList))for(i in 1:length(domainList)){c[domainList[i]] = c[domainList[i]] + answerList[i]d[domainList[i]] = d[domainList[i]] + 1# ————————————–assamble_table <- function(domainG,t,grade){if(length(domainG)< 7) {domainG = c(domainG, rep(0,2))}result = data.frame(# percentagedomain_1 = paste0(as.integer(domainG[1] * 100), “%”),domain_2 = paste0(as.integer(domainG[2] * 100), “%”),domain_3 = paste0(as.integer(domainG[3] * 100), “%”),domain_4 = paste0(as.integer(domainG[4] * 100), “%”),domain_5 = paste0(as.integer(domainG[5] * 100), “%”),domain_6 = paste0(as.integer(domainG[6] * 100), “%”),domain_7 = paste0(as.integer(domainG[7] * 100), “%”),total_score = paste0(as.integer(grade / 50 * 100), “%”)#changed domain nameassamble_table_special <- function(domainG,t,grade){if(length(domainG)< 7) {domainG = c(domainG, rep(0,2))}result = data.frame(# percentagedomain_1 = paste0(as.integer(domainG[1] * 100), “%”),domain_2 = paste0(as.integer(domainG[2] * 100), “%”),domain_3 = paste0(as.integer(domainG[3] * 100), “%”),domain_4 = paste0(as.integer(domainG[4] * 100), “%”),domain_5 = paste0(as.integer(domainG[5] * 100), “%”),domain_6 = paste0(as.integer(domainG[6] * 100), “%”),domain_7 = paste0(as.integer(domainG[7] * 100), “%”),total_score = paste0(as.integer(grade / 50 * 100), “%”)colnames(result)[1] = “Test”colnames(result)[2:8] = f_domain[f_domain$Test == t, c(“name”)]colnames(result)[9] = “Total_score”assamble_bar <- function(domainG, grade) {if(length(domainG)< 7) {domainG = c(domainG, rep(0,2))}for (i in 1:7) {res = c(res, domainG[i] * 100)res = c(res, grade / 50 * 100)# —————initiating—————–foo = shuffle_answers(testQA)testQA = foo$test_df correctAnswer = foo$correctAnswer# ——————————————server <- function(input, output, session) {# initiativescounters <- reactiveValues()counters$page <- 0counters$n <- 0counters$selection <- vector(length = 0)counters$test <- testQAcounters$correctAnswer <- c()counters$grade <- 0#—————————————————————————–# switch between test, javascript includeobserveEvent(input$start,{if(!is.null(input$RBstart)){counters$test <- get_test(input$RBstart)counters$correctAnswer <- get_correct_answer(correctAnswer,input$RBstart)counters$n <- nrow(counters$test)counters$selection <- vector(length = counters$n)shinyjs::hide(“RBstart”)shinyjs::hide(“start”)shinyjs::hide(“scoreButton”)shinyjs::show(“goButton”)shinyjs::show(“backButton”)shinyjs::show(“question”)shinyjs::show(“answers”) shinyjs::show(“submitButton”)shinyjs::show(“toMain”)observeEvent(input$submitButton,{shinyjs::hide(“goButton”)shinyjs::hide(“backButton”)shinyjs::hide(“question”)shinyjs::hide(“submitButton”)shinyjs::hide(“answers”)shinyjs::show(“grade”)shinyjs::show(“histogram”)shinyjs::show(“bp”)# changed, show “back” buttonshinyjs::show(“toMain”)# shinyjs::show(“scoretable”)# update to filedomainG = domainGrade(counters$test$Domain,as.integer(counters$correctAnswer == counters$selection)result = assamble_table(domainG, input$RBstart, counters$grade)if(!file.exists(“test_result.csv”)){write.csv(result,”test_result.csv”,row.names = F)f = read.csv(“test_result.csv”)f = rbind(f, result)write.csv(f,”test_result.csv”,row.names = F)viewscore <- observeEvent(input$scoreButton,{shinyjs::hide(“RBstart”)shinyjs::hide(“start”)shinyjs::show(“toMain”)shinyjs::show(“nameInput”)shinyjs::show(“passwordInput”)shinyjs::show(“loginButton”)backscore<- observeEvent(input$toMain,{shinyjs::show(“RBstart”)shinyjs::show(“start”)shinyjs::show(“scoreButton”)shinyjs::hide(“toMain”)shinyjs::hide(“nameInput”)shinyjs::hide(“passwordInput”)shinyjs::hide(“loginButton”)shinyjs::hide(“scoretable”)shinyjs::hide(“download”)shinyjs::hide(“bp”)shinyjs::hide(“grade”)shinyjs::hide(“histogram”)shinyjs::hide(“question”)shinyjs::hide(“answers”) shinyjs::hide(“submitButton”)shinyjs::hide(“goButton”)shinyjs::hide(“backButton”)#———————————————————————–page_forward <- observeEvent(input$goButton,{# ———- test————if(!is.null(input$answerButton)){counters$selection[counters$page+1] <- input$answerButton# —————————counters$grade <- sum(counters$correctAnswer == counters$selection)counters$page <- counters$page + 1page_backward <- observeEvent(input$backButton,{counters$page <- counters$page – 1output$question <- renderText({get_questions(counters$test,counters$page%%counters$n + 1)output$answers <- renderUI({radioButtons(“answerButton”, “select from following”,choiceNames = get_answers(counters$test,counters$page%%counters$n + 1),selected = counters$selection[counters$page%%counters$n+1], choiceValues = 1:length(get_answers(counters$test,counters$page%%counters$n + 1))output$grade <- renderTable({assamble_table_special(domainGrade(counters$test$Domain,as.integer(counters$correctAnswer == counters$selection)input$RBstart, counters$gradeoutput$histogram <- renderPlot({assamble_bar(domainGrade(counters$test$Domain,as.integer(counters$correctAnswer == counters$selection)counters$gradewidth=0.1,names=c(“1”, “2”, “3”, “4”, “5”, “6”, “7”, “total score”),ylim=c(0,100),yaxp=c(0, 100, 10),xlab=”Domain”,ylab=”Percentage”,font.lab=2,cex.lab=1.25,font.axis=2,col=”pink”,# draw a 70 lineabline(h=70, col=”Red”)# box plotoutput$bp <- renderPlot({# read filef = read.csv(“test_result.csv”)colnames(f)[1] <- “Test”res <- c()# fetch file’s test == input$RBstartt = f[f$Test==input$RBstart, ]# iterate domain id + total_scorefor (j in (1:8)){# iterate t’s rowsfor (i in 1:nrow(t)){# collect datares = c(res, as.integer(sub(“%”,””,t[i, j+1])))# cast c into matrixm <- matrix(res, nrow=8, byrow=TRUE)# collect domain into boxplotboxplot(m[1, ], m[2, ], m[3, ], m[4, ], m[5, ], m[6, ], m[7, ], m[8, ],ylim=c(0,100),names=c(“1”, “2”, “3”, “4”, “5”, “6”, “7”, “total score”),yaxp=c(0, 100, 10),font.axis=2,font.lab=2,xlab=”Domain”,ylab=”Percentage”)# draw a 70 lineabline(h=70, col=”Red”)output$scoretable <- renderTable({read.csv(“test_result.csv”)output$download <- downloadHandler(filename = function(){paste(“studentScore”,”csv”,sep=”.”)content = function(file){f = read.csv(“test_result.csv”)write.csv(f,file = file,row.names = F)# ————-this is for unit testing—————–output$test <- renderPrint({counters$test$Domainoutput$test2 <- renderPrint({as.integer(counters$correctAnswer == counters$selection)# ————————————————-# ————-this is for password—————–observeEvent(input$loginButton,{if(input$nameInput == NAME && input$passwordInput == PASSWORD){shinyjs::hide(“loginButton”)shinyjs::show(“scoretable”)shinyjs::show(“download”)shinyjs::hide(“nameInput”)shinyjs::hide(“passwordInput”)shinyjs::hide(“scoreButton”)# ————————————————-程序代写 CS代考加微信: assignmentchef QQ: 1823890830 Email: [email protected]

Reviews

There are no reviews yet.

Only logged in customers who have purchased this product may leave a review.

Shopping Cart
[SOLVED] CS代考 library(shinyjs)
30 $