# load required libraries
library(shiny)
library(plyr)
library(ggplot2)
library(googleVis)
## 
## Welcome to googleVis version 0.5.10
## 
## Please read the Google API Terms of Use
## before you start using the package:
## https://developers.google.com/terms/
## 
## Note, the plot method of googleVis will by default use
## the standard browser to display its output.
## 
## See the googleVis package vignettes for more details,
## or visit http://github.com/mages/googleVis.
## 
## To suppress this message use:
## suppressPackageStartupMessages(library(googleVis))
library(reshape2)

shinyUI(pageWithSidebar(
  headerPanel("Competitor Market Analysis"),
  
  sidebarPanel(
    helpText(" We have web scraped / web harvested the Product prices of Four vendors , we now compare these 
using our dynamic plots. "),
    
    tags$hr(),
    fileInput('file1', 'Choose CSV File from local drive, adjusting parameters if necessary',
              accept=c('text/csv', 'text/comma-separated-values,text/plain')),
    
    checkboxInput('header', 'Header', TRUE),
    radioButtons('sep', 'Separator',
                 c(Comma=',',
                   Semicolon=';',
                   Tab='\t'),
                 'Comma'),
    radioButtons('quote', 'Quote',
                 c(None='',
                   'Double Quote'='"',
                   'Single Quote'="'"),
                 'Double Quote'),
    tags$head(tags$style(type="text/css",
                         "label.radio { display: inline-block; margin:0 10 0 0;  }",
                         ".radio input[type=\"radio\"] { float: none; }"))
    
  ),
  mainPanel(
    tabsetPanel(
      tabPanel(" Product Prices ",
               h4(textOutput("caption1")),
               checkboxInput(inputId = "pageable", label = "Pageable"),
               conditionalPanel("input.pageable==true",
                                numericInput(inputId = "pagesize",
                                             label = "Product Prices per page",value=10,min=1,max=50)),
              
               htmlOutput("raw"),
                value = 1),
      tabPanel(" Day Price",
               h4(textOutput("caption2")),
               plotOutput("density"),
               htmlOutput("notes2"),
               value = 2),
      tabPanel("Difference",
               h4(textOutput("caption3")),
               plotOutput("VendorNameDensity", height="250px"),
               verbatimTextOutput("sexDiff"),
               htmlOutput("notes3"),
               value = 3),
      id="tabs1")
      

)
))
## Warning in validateSelected(selected, choices, inputId): 'selected' must be
## the values instead of names of 'choices' for the input 'sep'
## Warning in validateSelected(selected, choices, inputId): 'selected' must be
## the values instead of names of 'choices' for the input 'quote'

Competitor Market Analysis

We have web scraped / web harvested the Product prices of Four vendors , we now compare these using our dynamic plots.


# library(shinyapps)
# deployApp()
# ?setAccountInfo