Bob,
As usual you save the day. THANKS for your help.
Here is the final code, if anyone wishes to comment or revise the code... feel free... as of now it takes about 10 seconds to complete:
Sub SumCharges()
Dim ws As Worksheet: Set ws = ThisWorkbook.Worksheets("Charges")
Dim LastRow As Long: Let LastRow = ws.Range("A65536").End(xlUp).Row
Dim rDate As Range: Set rDate = ws.Range("C2:C" & LastRow)
Dim rCode As Range: Set rCode = ws.Range("A2:A" & LastRow)
Dim rAmount As Range: Set rAmount = ws.Range("F2:F" & LastRow)
Dim ws1 As Worksheet: Set ws1 = ThisWorkbook.Worksheets("Roll-Up")
Dim LastRow1 As Long: Let LastRow1 = ws1.Range("A65536").End(xlUp).Row
Dim LastCol As Long: Let LastCol = ws1.Range("A" & LastRow1).End(xlToRight).Column
Call Settings.SettingsOff
Dim R As Long, C As Long 'Used for Rows and Columns
Dim sFormula As String, sYear As String, sMonth As String
For C = 2 To LastCol 'Used for populating Columns
Application.StatusBar = Format(((C - 1) / LastCol) * 100, "0.0") & "% Complete..."
For R = 2 To LastRow1 - 5 'Used for populating Rows
If Cells(R, 1).Value = "" Then GoTo ZZ:
sYear = ws1.Evaluate("Year(A" & R & ")") & "/"
sMonth = Format(ws1.Cells(R, 1), "mm")
sFormula = "SumProduct((Code" & "=""" & Cells(1, C).Value & """)*(Date=""" & sYear & sMonth & """)*(Amount))"
Cells(R, C).Value = ws1.Evaluate(sFormula)
ZZ:
Next R
Next C
Call Settings.SettingsOn
End Sub