如何将TTR :: adjRatios()与tidyquant一起使用?

时间:2018-08-09 20:04:09

标签: r xts tidyquant

我正在尝试复制此example,它使用整齐的框架来调整股息的股票价格。

这是原始示例:

library(quantmod)
library(tidyquant)
library(timetk)
  
SPY.Close <- Cl(getSymbols("SPY", auto.assign=FALSE))
SPY.Div <- getDividends("SPY", auto.assign=FALSE)

# Within xts framework
SPY <- merge(SPY.Close, SPY.Div)

# now adjust close for dividends
ratios <- adjRatios(dividends=SPY[,"SPY.div"], close=SPY[,"SPY.Close"])
SPY$SPY.Adjusted <- (ratios$Split * ratios$Div) * SPY$SPY.Close
# only keep dates from the original object
SPY <- SPY[index(SPY.Close), ]

这是我在tidyquant中尝试执行的操作:

#convert xts to tibble
spy.tbl <- tk_tbl(merge(SPY.Close, SPY.Div), preserve_index = TRUE)

#add a splits placeholder because adjRatios() complains if its not there.
spy.tbl$SPY.splits <- 0

spy.adj <- spy.tbl %>% 
  tq_mutate(
    select = c(index, SPY.Close, SPY.div, SPY.splits),
    mutate_fun = adjRatios,
    splits = SPY.splits,
    dividends = SPY.div,
    close = SPY.Close
  )

但这给出了错误: fun_transmute(。,...)错误:未使用的参数(。)

我尝试了各种参数组合,但似乎无法使其发挥作用。

2 个答案:

答案 0 :(得分:1)

以防万一有人搜索此主题,我已经用以下代码解决了自己的问题。这样做的好处是,它是在tidyverse框架中完成的,并且可以通过group_by(ticker)轻松地扩展到许多代码中。

data是具有关闭和上一个关闭的数据框:

this.setState(p => ({ ...p, value: 1 })

div.data是仅包含股息支付的小标题,“日期”是“除息”日期。

        Date ticker  Close Cl.prev
1 2017-08-14 SPY_US 246.54  244.12
2 2017-08-15 SPY_US 246.51  246.54
3 2017-08-16 SPY_US 246.94  246.51
4 2017-08-17 SPY_US 243.09  246.94
5 2017-08-18 SPY_US 242.71  243.09
6 2017-08-21 SPY_US 242.90  242.71

此链将价格数据合并到div.data中,以获取价格来计算adjRatio

  ticker       Date      div
2 SPY_US 2017-09-15 1.234574
3 SPY_US 2017-12-15 1.351333
4 SPY_US 2018-03-16 1.096775
5 SPY_US 2018-06-15 1.245568

此链计算出adjRatio:

  div.data <- div.data %>% 
    left_join(., data[, c("Date", "ticker", "Close", "Cl.prev")], by = c("ticker", "Date"))  

此链将div.data合并回价格序列,传播adjRatio并计算调整后的收盘价:

  div.data <- div.data %>% 
    mutate(ratio = 1-div / Cl.prev) %>% 
    mutate(adjRatio = rev(cumprod(rev(ratio)))) %>% 
    select(-Close, -Cl.prev, -ratio)

这是最终数据:

data.adj <- data %>% 
  left_join(., div.data, by = c("ticker", "Date") ) %>% 
  mutate(adjRatio = dplyr::lead(adjRatio, n=1)) %>% 
  mutate(adjRatio = na.locf(adjRatio, fromLast = TRUE, na.rm = FALSE)) %>% 
  mutate(adjRatio = na.fill(adjRatio, fill = 1.0)) %>% 
  mutate(Cl.adj = Close * adjRatio) %>% 
  select(-Cl.prev, -div, -adjRatio)

答案 1 :(得分:0)

目前,tq_mutate()tq_mutate_xy()只有两种形式。 adjRatios()函数具有3个输入,这需要x,y,z。