11/4/2016

R Markdown

Using a online accessible business dashboard eliminates the need for sending around files and the potential of altering a document in irreperable ways. This app is a proof of concept for a simple scenario testing dashboard for internal company projects. The inputs are divided by the phase of the project as in Startup, Operation, and Shutdown. In each phase different inputs can be adjusted and changed. All output are fully reactive.

The key evaluation parameters are Internal Rate of Return and Net Present value (NPV) less the initial investment. The overall NPV of cash flows is also included.

Slide with Bullets

  • Adjust and Optimize initial investments
  • Find the right amount to spend on R&D
  • Stress test your model
  • Change annual growth predictions and optimize unit prices for sales
  • Optimize inventory Parameters and Fixed vs variable SG & A

NPV and IRR Functions

These are the NPV and IRR functions ported to R and examples.

npv <- function(rate, values) {sum(values / (1 + rate)^seq_along(values))}
irr <- function(x, start=0.1) {
       t <- seq_along(x)-1
       f <- function(i) abs(sum(x/(1+i)^t))
       return(nlm(f,start)$estimate)
}
cashflows <- c(-70000,-11380,-21400,22150,35350,35240,34680,34400,9800)
discountrate <- .06
npv(discountrate,cashflows)
## [1] 25117.28
irr(cashflows)
## [1] 0.1152114

Slide with Plot

An example of a basic output plot possible within the dashboard.