使用optim计算IRR

时间:2015-04-21 19:49:16

标签: r finance irr

我想找到内部收益率(IRR),基本上是'率'这使我的NPV函数变为零,使用optim函数。

我目前的NPV功能代码(有效)是:

npv <- function(rate, cf){
    r_v <- rep (rate,length (cf))
    t_v <- as.numeric (seq(1:length (cf)))
    pv <- cf * exp (-t_v*r_v)
    sum (pv)
} 

我尝试使用以下optim函数:

InternalRateReturn <- optim(c(0,1), npv, cf = testcf2, gr = NULL, method = "L-BFGS-B", lower = -Inf, upper = Inf,control=list(), hessian = FALSE)

但它没有回复InternalRateReturn$par的正确答案,而不是使用下面的uniroot方法。

请问如何修改此代码(重申一下,我只想优化npv函数中的速率,使npv函数等于零)?

使用uniroot的IRR功能如下:

irr1 <- function(cf) {
    uniroot(npv, c(0, 1), cf=cf)$root
}

2 个答案:

答案 0 :(得分:2)

使用optimMatt Brigida

计算内部收益率的非常酷的例子
### IRR Function:  Takes a vector of payments and returns a list which includes the internal rate of return ($IRR) and possible word of warning ($beware) ----

irr <- function(x, period = 1, starting.value = .1){

### This should detect the number of sign changes.  Should correctly not warn if there are many negative cash flows (so long as there is only 1 change in sign).

    irr.func <- function(r){ ( sum(x / (1 + r)^{0:(length(x)-1)}) )^2 }
    result <- optim(par = starting.value, fn = irr.func, method = "Brent", lower = -1000000, upper = 1000000)

    ## detecting number of sign changes
    x.ge.0 <- 1 * (x >= 0)
    changes <- diff(x.ge.0)
    changes <- changes * changes
    num.changes <- sum(changes)

    if( num.changes > 1) {

        statement <- "Your cash flows change more than once -- so you may have multiple IRRs. This function will only return the first IRR it finds. To find the others, you can try different starting values.  However, note the IRR does not make sense if the signs change more than once (try Modified IRR or NPV)."
        value <- period * result$par
        return(list(beware = statement, IRR = value))

    } else {

        return(list(IRR = period * result$par))

    }
}

Matt对于更现实的修正IRR也有一个非常有用的功能(对再投资率没有做出不合理的假设)

### Modified IRR (MIRR) Function:  Takes a vector of payments and returns the MIRR by ----

mirr <- function(x, period = 1, starting.value = .1, discount.rate = 0.1, investment.rate = 0.05){

    ## move cash flows
    ## negative
    cf.neg <- (x < 0) * x
    ## discounted
    pv.cf.neg <- cf.neg / (1 + discount.rate)^{0:(length(x)-1)}
    pv <- sum(pv.cf.neg)

    ## positive
    cf.pos <- (x > 0) * x
    fv.cf.pos <- cf.pos * (1 + investment.rate)^{0:(length(x)-1)}
    fv <- sum(fv.cf.pos)

    mirr.per.period <- ( fv / abs(pv) )^{1 / (length(x))} - 1

    return( period * mirr.per.period )
} 

答案 1 :(得分:0)

如果您只需要计算IRR或NPV(或MIRR),并且由于不清楚为什么您绝对需要使用optim,您可以只考虑包financial或{{1而不是黑客攻击你自己的功能。像这样:

FinCal