CODE:
# '#' denotes a comment
# install.packages("UsingR") uncomment if package is not installed
library(UsingR)
# install.packages("shiny") uncomment if package is not installed
library(shiny)
library(shiny)
# install.packages("Hmisc") uncomment if package is not installed
library(Hmisc)
library(Hmisc)
# install.packages("corrplot") uncomment if package is not installed
library(corrplot)
library(corrplot)
# getwd() gives the current directory where R looks up for files
wd <- getwd()
setwd(wd)
setwd(wd)
# this is a responsive ui which has a file input selector and a plot
ui <- fluidPage(
fluidRow(
fileInput('infile', 'Choose file to upload',
accept = c(
'text/csv',
'text/comma-separated-values',
'.csv'
)
),
plotOutput("distPlot")
)
)
fluidRow(
fileInput('infile', 'Choose file to upload',
accept = c(
'text/csv',
'text/comma-separated-values',
'.csv'
)
),
plotOutput("distPlot")
)
)
# logic for showing histogram in plot
server <- function(input, output) {
plotdata <- reactive({
filestr <- input$infile
read.csv(filestr$name)
})
output$distPlot <- renderPlot({
hist(plotdata())
})
}
plotdata <- reactive({
filestr <- input$infile
read.csv(filestr$name)
})
output$distPlot <- renderPlot({
hist(plotdata())
})
}
# this command processes the above code and launches the window containing the output
shinyApp(ui=ui, server=server)
NOTE:
Make sure you put the .csv file to process in working directory of R otherwise it will throw error: "'x' must be numeric" (you can check it with getwd() command).
OUTPUT:
(click on image to zoom in)
No comments:
Post a Comment
Note: Only a member of this blog may post a comment.