Warning: file_get_contents(/data/phpspider/zhask/data//catemap/8/variables/2.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
Shiny 主面板无法在闪亮的仪表板中工作_Shiny_Shinydashboard - Fatal编程技术网

Shiny 主面板无法在闪亮的仪表板中工作

Shiny 主面板无法在闪亮的仪表板中工作,shiny,shinydashboard,Shiny,Shinydashboard,问题1:我试图应用shinyDashboard软件包,但没有数据表显示 创建并行计算集群和支持功能。 ##使用内核准备并行集群 双并行::寄存器双并行(核心=16) pkgs试试这个: output$table1 <- renderDataTable({ a <- as.data.frame(subset(... ..) #your code ) a }, options <your code>) output$table1##创建并行计算集群和支持功能。 ##使

问题1:我试图应用shinyDashboard软件包,但没有数据表显示

创建并行计算集群和支持功能。 ##使用内核准备并行集群 双并行::寄存器双并行(核心=16) pkgs试试这个:

output$table1 <- renderDataTable({
 a <- as.data.frame(subset(... ..) #your code
)
a }, options <your code>)
output$table1
##创建并行计算集群和支持功能。
##使用内核准备并行集群
双并行::寄存器双并行(核心=16)

pkgs问题1:鉴于您的示例代码似乎有效,所以问题不清楚。问题2:你的日志在编码时说什么是没有ShinyDashboard的工作。。。任何解决方案?输出$table1,而此代码可能会回答问题,提供关于为什么和/或如何回答问题的附加上下文将显著提高其长期价值。请您的回答添加一些解释。@RYOENG:请将shinydashbord的源代码放在屏幕上,而不是图像上,这样我就可以很容易地复制出来。@RahulAgarwal我添加了有和没有shinydashbord的源代码。。。它的工作没有shinydashboard,但我只是想使用shinydashboard,使整个shinyapp用户友好。请调查一下这个?
# server.R

suppressMessages(library('BBmisc'))
pkgs <- c('shiny', 'shinythemes', 'shinyjs', 'shinyBS', 'shinydashboard', 'shinyAce', 'quantmod', 
          'TTR', 'plyr', 'dplyr', 'magrittr', 'stringr', 'purrr', 'googleCharts', 'lubridate', 
          'googleVis', 'DT', 'sparkline', 'zoo')
suppressMessages(lib(pkgs))
rm(pkgs)

tickers <- c('BET', 'BOTB', 'BPTY', 'WMH', 'SPO', '888', 'NPT', 'PTEC', 'PCGE', 'TTR', 'GVC', 'WEB', 
             'BOX', 'RNK', 'LAD', 'STR', 'LVS', 'TNI', 'WYNN', 'MGM', 'MPEL', 'MCRI', 'GXYEY', 'BYD', 
             'GIGNY', 'CACQ', 'PENN', 'GEBHY', 'WYNMF', 'CWLDY', 'SCHYF', 'SKYZF', 'MCHVY', 'EGT', 
             'GPIC', 'SGMS', 'NGCRF', 'TACBY', 'IGT', 'GDEN', 'ISLE', 'GLXZ', 'SJMHF', 'PDSSF', 'PNK') %>% sort

data <- llply(tickers, function(x) {
  y = data.frame(Com=x, as.data.frame(
    tryCatch(suppressAll(getSymbols(x, src = 'google', auto.assign = FALSE)), error = function(e) 
      data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA)))); 
  if(nrow(na.omit(y))==0) {
    y = data.frame(Com=x, as.data.frame(
      tryCatch(suppressAll(getSymbols(x, src = 'yahoo', auto.assign = FALSE)), 
               error = function(e) data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA))))
  }else{
    y %<>% mutate(Date=as.character(rownames(.)), Weekday=factor(weekdays(ymd(Date))));
    names(y) <- c('Com', 'Open', 'High', 'Low', 'Close', 'Volume', 'Date', 'Weekday')}; 
  y}, .parallel=TRUE) %>% rbind_all %>% tbl_df %>% 
  select(Date, Weekday, Com, Open, High, Low, Close, Volume) %>% mutate(Com=factor(Com))

#'@ googleChartsInit(chartTypes = c("ALL", "annotatedtimeline", "area", "bar", "bubble", "calendar", "candlestick", 
#'  "column", "combo", "gauge", "geo", "geomap", "intensitymap", "line", "map", "motion", "org", "pie", "sankey", 
#'  "scatter", "steppedarea", "table", "timeline", "treemap"))
## =================================================================================================

#'@ shiny::runApp(list(
  ui = pageWithSidebar(
    headerPanel("Example"),
    sidebarPanel(
      helpText('Select the stocks to examine. Information will be collected from Google/Yahoo finance.'),
      checkboxGroupInput('counter', 'Select counter(s)', choices = tickers), 
      actionLink('selectall', 'Select/Unselect All'),
      br(),
      br(),
      dateRangeInput('dates', 'Date range', start = '2013-01-01', end = as.character(Sys.Date())),
      br(),
      checkboxInput('log', 'Plot y axis on log scale', value = FALSE),
      checkboxInput('adjust', 'Adjust prices for inflation', value = FALSE)),
    mainPanel(
      tabsetPanel(
        tabPanel('Data', dataTableOutput('table1'),
                 downloadButton('downloadData', 'Download')),
        tabPanel('Plot', htmlOutput('gvis')))
    ))#'@ ,

  server = function(input, output, session) {
    observe({
      if(input$selectall == 0) return(NULL)
      else if(input$selectall%%2 == 0){
        updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers)
      }else{
        updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers, selected = tickers)
      }
    })

    output$table1 <- renderDataTable({
      datatable(subset(data, Com %in% input$counter & Date>=input$dates[1] & Date<=input$dates[2]),
        caption="Table 1.1.1 : Public Listed Companies Stock Price",
        extensions = list("ColReorder"=NULL, "ColVis"=NULL, "TableTools"=NULL
                          #, "FixedColumns"=list(leftColumns=2)
                          ), 
        options = list(autoWidth=TRUE, 
                       oColReorder=list(realtime=TRUE), #oColVis=list(exclude=c(0, 1), activate='mouseover'),
                       oTableTools=list(
                         sSwfPath="//cdnjs.cloudflare.com/ajax/libs/datatables-tabletools/2.1.5/swf/copy_csv_xls.swf",
                         aButtons=list("copy", "print",
                                       list(sExtends="collection", sButtonText="Save",
                                            aButtons=c("csv","xls")))),
                       dom='CRTrilftp', scrollX=TRUE, scrollCollapse=TRUE,
                       colVis=list(exclude=c(0), activate='mouseover')))
    })

    output$gvis <- renderGvis({
      smp <- subset(data, Com %in% input$counter &
                      Date>=input$dates[1] & Date<=input$dates[2])
      if(input$adjust) smp <- adjust(subset(data, Com %in% input$counter &
                                            Date>=input$dates[1] & Date<=input$dates[2]))
      if(input$log) smp <- mutate(subset(data, Com %in% input$counter, 
                                         Date>=input$dates[1] & Date<=input$dates[2]), 
                                  Low=log(Low), Open=log(Open), Close=log(Close), High=log(High))
      gvisCandlestickChart(smp, xvar='Date', low='Low', open='Open', close='Close', high='High', 
                           options=list(legend='none', gvis.editor="Edit me!"))
    })
  }
#'@ ))

# Run the application 
shinyApp(ui = ui, server = server)
output$table1 <- renderDataTable({
 a <- as.data.frame(subset(... ..) #your code
)
a }, options <your code>)
## Creating a parallel computing Cluster and support functions.
## Preparing the parallel cluster using the cores
doParallel::registerDoParallel(cores = 16)
pkgs <- c('shiny','shinydashboard','magrittr','plyr','dplyr','googleVis','quantmod','TTR','lubridate','DT')
suppressMessages(require('BBmisc')); suppressMessages(lib(pkgs)); rm(pkgs)

## Set the googleVis options first to change the behaviour of plot.gvis, so that only the chart 
##  component of the HTML file is written into the output file.
op <- options(gvis.plot.tag='chart')

tickers <- sort(c('BET', 'BOTB', 'BPTY', 'WMH', 'SPO', '888', 'NPT', 'PTEC', 'PCGE', 'TTR', 'GVC', 'WEB', 
                  'BOX', 'RNK', 'LAD', 'STR', 'LVS', 'TNI', 'WYNN', 'MGM', 'MPEL', 'MCRI', 'GXYEY', 'BYD', 
                  'GIGNY', 'CACQ', 'PENN', 'GEBHY', 'WYNMF', 'CWLDY', 'SCHYF', 'SKYZF', 'MCHVY', 'EGT', 
                  'GPIC', 'SGMS', 'NGCRF', 'TACBY', 'IGT', 'GDEN', 'ISLE', 'GLXZ', 'SJMHF', 'PDSSF', 'PNK'))

ui <- dashboardPage(
    dashboardHeader(title = "Dynamic sidebar"),
    dashboardSidebar(),
    dashboardBody(
        fluidPage(
            titlePanel('Stock Price'),
            sidebarLayout(
                sidebarPanel(
                    helpText('Select the stocks to examine. Information will be collected from Google/Yahoo finance.'),
                    checkboxGroupInput('counter', 'Select counter(s)', choices = tickers), 
                    actionLink('selectall', 'Select/Unselect All'),
                    br(),
                    br(),
                    dateRangeInput('dates', 'Date range', start = '2013-01-01', end = as.character(Sys.Date())),
                    checkboxInput('log', 'Plot y axis on log scale', value = FALSE),
                    checkboxInput('adjust', 'Adjust prices for inflation', value = FALSE)),
                mainPanel(
                    tabsetPanel( #tabBox
                        tabPanel('Table', dataTableOutput('table1'), 
                                 downloadButton('downloadData', 'Download')),
                        tabPanel('Chart', htmlOutput('gvis')))
                )))
    )
)

server <- function(input, output, session) {
    observe({
        if(input$selectall == 0) return(NULL)
        else if(input$selectall%%2 == 0){
            updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers)
        }else{
            updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers, selected = tickers)
        }
    })

    getCounter <- function(){
        tickers <- c('BET', 'BOTB', 'BPTY', 'WMH', 'SPO', '888', 'NPT', 'PTEC', 'PCGE', 'TTR', 'GVC', 'WEB', 
                 'BOX', 'RNK', 'LAD', 'STR', 'LVS', 'TNI', 'WYNN', 'MGM', 'MPEL', 'MCRI', 'GXYEY', 'BYD', 
                 'GIGNY', 'CACQ', 'PENN', 'GEBHY', 'WYNMF', 'CWLDY', 'SCHYF', 'SKYZF', 'MCHVY', 'EGT', 
                 'GPIC', 'SGMS', 'NGCRF', 'TACBY', 'IGT', 'GDEN', 'ISLE', 'GLXZ', 'SJMHF', 'PDSSF', 'PNK') %>% sort
        data <- llply(tickers, function(x) {
            y = data.frame(Com=x, as.data.frame(
                tryCatch(suppressAll(getSymbols(x, src = 'google', auto.assign = FALSE)), error = function(e) 
                    data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA)))); 
            if(nrow(na.omit(y))==0) {
                y = data.frame(Com=x, as.data.frame(
                    tryCatch(suppressAll(getSymbols(x, src = 'yahoo', auto.assign = FALSE)), 
                             error = function(e) data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA))))
            }else{
                y %<>% mutate(Date=as.character(rownames(.)), Weekday=factor(weekdays(ymd(Date))));
                names(y) <- c('Com', 'Open', 'High', 'Low', 'Close', 'Volume', 'Date', 'Weekday')}; 
            y}, .parallel=TRUE) %>% rbind_all %>% tbl_df %>% 
            select(Date, Weekday, Com, Open, High, Low, Close, Volume) %>% mutate(Com=factor(Com))
        return(data)
    }

    output$table1 <- renderDataTable({
        data <- getCounter()
        df <- as.data.frame(subset(data, Com %in% input$counter & Date>=input$dates[1] & Date<=input$dates[2]));
        dt <- datatable(df, 
                        caption="Table 1.1.1 : Public Listed Companies Stock Price",
                        extensions = list("ColReorder"=NULL, "ColVis"=NULL, "TableTools"=NULL
                                          #, "FixedColumns"=list(leftColumns=2)
                        ), 
                        options = list(autoWidth=TRUE,
                                       oColReorder=list(realtime=TRUE), #oColVis=list(exclude=c(0, 1), activate='mouseover'),
                                       oTableTools=list(
                                           sSwfPath="//cdnjs.cloudflare.com/ajax/libs/datatables-tabletools/2.1.5/swf/copy_csv_xls.swf",
                                           aButtons=list("copy", "print",
                                                         list(sExtends="collection", sButtonText="Save",
                                                              aButtons=c("csv","xls")))),
                                       dom='CRTrilftp', scrollX=TRUE, scrollCollapse=TRUE,
                                       colVis=list(exclude=c(0), activate='mouseover')))
        return(dt)
    })

    output$gvis <- renderGvis({
        data <- getCounter()
        smp <- subset(data, Com %in% input$counter &
                          Date>=input$dates[1] & Date<=input$dates[2])
        if(input$adjust) smp <- adjust(subset(data, Com %in% input$counter &
                                                  Date>=input$dates[1] & Date<=input$dates[2]))
        if(input$log) smp <- mutate(subset(data, Com %in% input$counter, 
                                           Date>=input$dates[1] & Date<=input$dates[2]), 
                                    Low=log(Low), Open=log(Open), Close=log(Close), High=log(High))
        gvisCandlestickChart(smp, xvar='Date', low='Low', open='Open', close='Close', high='High', 
                             options=list(legend='none', gvis.editor="Edit me!"))
    })
}

runApp(shinyApp(ui, server), display.mode='showcase')
## Creating a parallel computing Cluster and support functions.
## Preparing the parallel cluster using the cores
doParallel::registerDoParallel(cores = 16)
pkgs <- c('shiny','shinydashboard','magrittr','plyr','dplyr','googleVis','quantmod','TTR','lubridate','DT','purrr')
suppressMessages(require('BBmisc'))
suppressMessages(lib(pkgs)); rm(pkgs)

## Set the googleVis options first to change the behaviour of plot.gvis, so that only the chart 
##  component of the HTML file is written into the output file.
op <- options(gvis.plot.tag='chart')

tickers <- sort(c('BET', 'BOTB', 'BPTY', 'WMH', 'SPO', '888', 'NPT', 'PTEC', 'PCGE', 'TTR', 'GVC', 'WEB', 
                  'BOX', 'RNK', 'LAD', 'STR', 'LVS', 'TNI', 'WYNN', 'MGM', 'MPEL', 'MCRI', 'GXYEY', 'BYD', 
                  'GIGNY', 'CACQ', 'PENN', 'GEBHY', 'WYNMF', 'CWLDY', 'SCHYF', 'SKYZF', 'MCHVY', 'EGT', 
                  'GPIC', 'SGMS', 'NGCRF', 'TACBY', 'IGT', 'GDEN', 'ISLE', 'GLXZ', 'SJMHF', 'PDSSF', 'PNK'))

ui <- dashboardPage(
  dashboardHeader(title = "Dynamic sidebar"),
  dashboardSidebar(),
  dashboardBody(
    fluidPage(
      titlePanel('Stock Price'),
      sidebarLayout(
        sidebarPanel(
          helpText('Select the stocks to examine. Information will be collected from Google/Yahoo finance.'),
          checkboxGroupInput('counter', 'Select counter(s)', choices = tickers), 
          actionLink('selectall', 'Select/Unselect All'),
          br(),
          br(),
          dateRangeInput('dates', 'Date range', start = '2013-01-01', end = as.character(Sys.Date())),
          checkboxInput('log', 'Plot y axis on log scale', value = FALSE),
          checkboxInput('adjust', 'Adjust prices for inflation', value = FALSE)),
        mainPanel(
          tabsetPanel( #tabBox
            tabPanel('Table', dataTableOutput('table1'), 
                     downloadButton('downloadData', 'Download')),
            tabPanel('Chart', htmlOutput('gvis')))
        )))
  )
)

server <- function(input, output, session) {
  observe({
    if(input$selectall == 0) return(NULL)
    else if(input$selectall%%2 == 0){
      updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers)
    }else{
      updateCheckboxGroupInput(session, 'counter', 'Select counter(s)', choices = tickers, selected = tickers)
    }
  })

  getCounter <- function(){
    data <- na.omit(data.frame(Com=NA, Open=NA, High=NA, Low=NA, Close=NA, Volume=NA, Date=NA, Weekday=NA))
    data <- llply(input$counter, function(x) {
      y = data.frame(Com=x, as.data.frame(
        tryCatch(suppressAll(na.omit(getSymbols(x, src = 'google', auto.assign = FALSE, 
                                        start = input$dates[1], end = input$dates[2]))), 
                 error = function(e) data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA)))); 
      if(nrow(na.omit(y))==0) {
        y = data.frame(Com=x, as.data.frame(
          tryCatch(suppressAll(na.omit(getSymbols(x, src = 'yahoo', auto.assign = FALSE, 
                                          start = input$dates[1], end = input$dates[2]))), 
                   error = function(e) data.frame(Open=NA, High=NA, Low=NA, Close=NA, Volume=NA))))
      }else{
        y %<>% mutate(Date=as.character(rownames(.)), Weekday=factor(weekdays(ymd(Date))));
        names(y) <- c('Com', 'Open', 'High', 'Low', 'Close', 'Volume', 'Date', 'Weekday')}; 
      y}, .parallel=TRUE) %>% rbind_all %>% tbl_df %>% 
      select(Date, Weekday, Com, Open, High, Low, Close, Volume) %>% mutate(Com=factor(Com)) %>% na.omit
    return(data)
  }

  output$table1 <- renderDataTable({
    data <- getCounter()
    data <- datatable(data, 
                    caption="Table 1.1.1 : Public Listed Companies Stock Price",
                    extensions = list("ColReorder"=NULL, "ColVis"=NULL, "TableTools"=NULL
                                      #, "FixedColumns"=list(leftColumns=2)
                    ), 
                    options = list(autoWidth=TRUE,
                                   oColReorder=list(realtime=TRUE), #oColVis=list(exclude=c(0, 1), activate='mouseover'),
                                   oTableTools=list(
                                     sSwfPath="//cdnjs.cloudflare.com/ajax/libs/datatables-tabletools/2.1.5/swf/copy_csv_xls.swf",
                                     aButtons=list("copy", "print",
                                                   list(sExtends="collection", sButtonText="Save",
                                                        aButtons=c("csv","xls")))),
                                   dom='CRTrilftp', scrollX=TRUE, scrollCollapse=TRUE,
                                   colVis=list(exclude=c(0), activate='mouseover')))
    return(dt)
  })

  output$gvis <- renderGvis({
    data <- getCounter()
    if(input$adjust) data <- adjust(data)
    if(input$log) data <- mutate(data, Low=log(Low), Open=log(Open), Close=log(Close), High=log(High))
    gvisCandlestickChart(data, xvar='Date', low='Low', open='Open', close='Close', high='High', 
                         options=list(legend='none', gvis.editor="Edit me!"))
  })
}

#'@ runApp(shinyApp(ui, server), display.mode='showcase')
shinyApp(ui, server)