Warning: file_get_contents(/data/phpspider/zhask/data//catemap/4/r/80.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
R:x2018中的索引项;订单由’;不是独一无二的(动物园)_R_Ggplot2_Shiny_Zoo - Fatal编程技术网

R:x2018中的索引项;订单由’;不是独一无二的(动物园)

R:x2018中的索引项;订单由’;不是独一无二的(动物园),r,ggplot2,shiny,zoo,R,Ggplot2,Shiny,Zoo,我正在把财务数据拉进来,并试图用shiny输出它。我不熟悉动物园的功能。在尝试使正返回为绿色,负返回为红色时,我收到以下错误: 动物园警告(cd,order.by=index(x),…): 如果“order.by”中的索引项不唯一,则“zoo”对象的某些方法不起作用 library(tidyverse) library(tidyquant) library(shiny) #Stock assignments stock_1<-'AMZN' stock_2<-'CMG' stock_

我正在把财务数据拉进来,并试图用shiny输出它。我不熟悉动物园的功能。在尝试使正返回为绿色,负返回为红色时,我收到以下错误:

动物园警告(cd,order.by=index(x),…): 如果“order.by”中的索引项不唯一,则“zoo”对象的某些方法不起作用

library(tidyverse)
library(tidyquant)
library(shiny)

#Stock assignments
stock_1<-'AMZN'
stock_2<-'CMG'
stock_3<-'TSS'  
stock_4<-'FB'
stock_5<-'T'

#Creating Input Boxes for Stocks and Weights of the Portfolio
ui <- fluidPage(
  titlePanel('Portfolio Daily Returns'),
  sidebarLayout(
    sidebarPanel(
      fluidRow(
        column(6,textInput("S1",h3('Input Stock 1'),stock_1)),
        column(6,numericInput("w1",h3("Input Weight 1"),.25))
      ),
      fluidRow(
        column(6,textInput("S2",h3('Input Stock 2'),stock_2)),
        column(6,numericInput("w2",h3("Input Weight 2"),.25))
      ),
      fluidRow(
        column(6,textInput("S3",h3('Input Stock 3'),stock_3)),
        column(6,numericInput("w3",h3("Input Weight 3"),.2))
      ),
      fluidRow(
        column(6,textInput("S4",h3('Input Stock 4'),stock_4)),
        column(6,numericInput("w4",h3("Input Weight 4"),.2))
      ),
      fluidRow(
        column(6,textInput("S5",h3('Input Stock 5'),stock_5)),
        column(6,numericInput("w5",h3("Input Weight 5"),.1))
      ),
      dateRangeInput("D",h3("Input Start and End Dates"),
                     '2019-09-01',Sys.Date())
    ),
    mainPanel(plotOutput("plot"))
  )
)

#Shows daily volatility of your portfolio returns. Set for the last month but can adjust
server <- function(input,output){
  dataInput <- reactive({
    dat <- tq_get(c(input$S1,input$S2,input$S3,input$S4,input$S5),from=input$D[1],to=input$D[2])%>%
      group_by(symbol)%>%
      tq_transmute(select=volume,mutate_fun = periodReturn,period='daily',
                   col_rename = 'Daily_Vol')%>%
      tq_portfolio(assets_col=symbol,returns_col = Daily_Vol,weights=c(
        input$w1,input$w2,input$w3,input$w4,input$w5),col_rename = 'Port_Vol')
    dat$sign = ifelse(dat$Port_Vol >= 0, "positive", "negative")
    return(dat)
  })


  output$plot <- renderPlot({
    ggplot(dataInput(),aes(x=date,y=Port_Vol))+geom_col()
      scale_fill_manual(values = c("positive"="green","negative"="red"))
  })
}

shinyApp(ui=ui,server=server)
库(tidyverse)
图书馆(tidyquant)
图书馆(闪亮)
#股票转让

stock_1这里有一个解决方案,可以得到一个带有红色和绿色条的图。首先更改dat$符号赋值语句以匹配以下内容:

dat$sign = ifelse(dat$Port_Vol >= 0, TRUE, FALSE)
然后更改renderPlot语句以匹配以下内容:

output$plot <- renderPlot({
  dat <- dataInput()
  ggplot(dat,aes(x=date,y=Port_Vol,fill=sign))+geom_col()+
  scale_fill_manual(values = c("red","green"))
})

output$plot澄清一下,问题出在代码的最后两部分。