Public Sub ProcessData()
Dim LastRow As Long
Dim iRow As Long
Dim i As Long
With ActiveSheet
LastRow = .Cells(.Rows.Count, "A").End(xlUp).Row
For i = LastRow To 1 Step -1
iRow = Application.Match(.Cells(i, "A").Value, .Columns(1), 0)
If iRow <> i Then
.Cells(iRow, "C").Value = .Cells(iRow, "C").Value + .Cells(i, "C").Value
.Cells(iRow, "E").Value = .Cells(iRow, "E").Value + .Cells(i, "E").Value
.Cells(iRow, "G").Value = .Cells(iRow, "G").Value + .Cells(i, "G").Value
.Cells(iRow, "I").Value = .Cells(iRow, "I").Value + .Cells(i, "I").Value
.Cells(iRow, "K").Value = .Cells(iRow, "K").Value + .Cells(i, "K").Value
.Cells(iRow, "M").Value = .Cells(iRow, "M").Value + .Cells(i, "M").Value
.Rows(i).Delete
End If
Next i
End With
End Sub
and no, you can't have my email, this is a community forum.