Invalid Argument error

library(shiny)
library(arules)

Define server logic required to draw a histogram

shinyServer(function(input, output) {

output$mba <- renderPrint({

  tr <- read.transactions('market_basket_Apr.csv', format = 'basket', sep=',')
  
  rules <- apriori(tr , parameter = list(support=as.numeric(input$sup)), confidence =as.numeric(input$con))
  inspect(rules)  

})

}) #server_Side

library(shiny)

Define UI for application that draws a histogram

shinyUI(fluidPage(

titlePanel("FYP"),


sidebarLayout(
    sidebarPanel(
        select.list("sup", "Select desired Support Value", choices = c(.1,.01,.001,.0001,.005)),
        select.list("con", "Select desired Confidence Value", choices = c(.5,.6,.7,.8,.9))
    ),

    # Show a plot of the generated distribution
    mainPanel(
        verbatimTextOutput("mba")
    )
)

)) #UI_Side

Im fairly new to R and data science and even though i followed a tutorial it gives me an invalid argument error and the titles are leftovers from a past code for a histogram not the code ive sent here.

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.