Avatar of mgw08
mgw08
 asked on

Access 2007 VBA XIRR Function Error

I found the code below on an old post from the year 2000.  I'm an trying to input into my database but I receive a Run Time Error '13': Type Mismatch.  My thought is the syntax may be different in the different versions of Access, but I'm a newbie, so don't know...
On the debug it points to the line:  Set rstXIRR = dbs.openrecordset("TableXIRR", dbOpenDynaset).
Does anyone have any thoughts of what could generate the type mismatch error?
Thank you.
Option Compare Database
 
Function XIRR(aXIRR As Variant, nRate As Double, nPayments As Integer) As Double
Dim i As Integer
XIRR = 0                                        ' residual of function
For i = 1 To nPayments
  XIRR = XIRR + aXIRR(i, 2) / (1 + nRate) ^ (aXIRR(i, 1) / 365)
Next i
 
End Function
 
Private Sub CommandRunXIRR_Click()
Dim dbs As Database
Dim rstXIRR As Recordset
Dim aXIRR() As Double
Dim nPayments As Integer
Dim dFirstPayDate As Date
Dim i As Integer, j As Integer
Dim nRate As Double, nLastRate As Double, nRateStep As Double
Dim nXIRR As Double
 
Dim nResidual As Double, nLastResidual As Double
 
 
Set dbs = CurrentDb
Set rstXIRR = dbs.OpenRecordset("TableXIRR", dbOpenDynaset)
 
nPayments = DCount("PayDate", "TableXIRR")
ReDim aXIRR(nPayments, 3)
dFirstPayDate = DMin("PayDate", "TableXIRR")
 
nRate = 0.1                                                                     ' initial guess
nRateStep = 0.1                                                              ' arbitrary guess
 
i = 1
With rstXIRR
While Not .EOF
  aXIRR(i, 1) = DateDiff("d", dFirstPayDate, !PayDate)
  aXIRR(i, 2) = !Payment
  i = i + 1
  .MoveNext
Wend
End With
 
 
nResidual = 10
nLastResidual = 1
nLastRate = nRate
i = 0
 
While i < 100 And Abs((nLastResidual - nResidual) / nLastResidual) > 10 ^ -8
nLastResidual = nResidual
nResidual = XIRR(aXIRR, nRate, nPayments)
nLastRate = nRate
If nResidual >= 0 Then
  nRate = nRate + nRateStep
Else
  nRateStep = nRateStep / 2
  nRate = nRate - nRateStep
End If
i = i + 1
Wend
 
nXIRR = nLastRate
 
Debug.Print "The internal rate of return is "; Format(nXIRR, "#.##%")
End Sub

Open in new window

Microsoft Access

Avatar of undefined
Last Comment
mgw08

8/22/2022 - Mon
ASKER CERTIFIED SOLUTION
peter57r

THIS SOLUTION ONLY AVAILABLE TO MEMBERS.
View this solution by signing up for a free trial.
Members can start a 7-Day free trial and enjoy unlimited access to the platform.
See Pricing Options
Start Free Trial
GET A PERSONALIZED SOLUTION
Ask your own question & get feedback from real experts
Find out why thousands trust the EE community with their toughest problems.
mgw08

ASKER
Thank you so much....work's great!
Experts Exchange is like having an extremely knowledgeable team sitting and waiting for your call. Couldn't do my job half as well as I do without it!
James Murphy