Link to home
Start Free TrialLog in
Avatar of Glenn Stearns
Glenn StearnsFlag for United States of America

asked on

Add Formulas in VBA to Sub-Total Rows

I have a sheet which I can sort and subtotal fine in VBA. Here is the code:

Sub Macro1()
'
' Macro1 Macro
'
' Keyboard Shortcut: Ctrl+Shift+A
'
    Range("A1").Select
    ActiveWorkbook.Worksheets("December 12").Sort.SortFields.Clear
    ActiveWorkbook.Worksheets("December 12").Sort.SortFields.Add Key:=Range( _
        "D2:D55"), SortOn:=xlSortOnValues, Order:=xlAscending, DataOption:= _
        xlSortNormal
    With ActiveWorkbook.Worksheets("December 12").Sort
        .SetRange Range("A1:H55")
        .Header = xlYes
        .MatchCase = False
        .Orientation = xlTopToBottom
        .SortMethod = xlPinYin
        .Apply
    End With
    Selection.Subtotal GroupBy:=4, Function:=xlCount, TotalList:=Array(4), _
        Replace:=True, PageBreaks:=False, SummaryBelowData:=True
End Sub

The code above puts the count of the number of rows in the sub-total section in column D of the sub-total rows in the sheet for each subtotal section. This is what I want it to do. Now, on each sub-total row, there are three other columns that I want the code to calculate a number and place it at the foot of the sub-total columns just as it does for the one sub-total the code is already calculating.

Now that we have sub-total rows in the worksheet, I need to add to the code so that VBA will look for each sub-total row and run a COUNTIF formula on columns E, F, and H. For columns E and F, it is to COUNTIF the criteria is "Y", and for column H, the criteria is "N". Then it needs to put the result of the COUNTIF formulas on the sub-total row for each section of sub-totals. The number of rows in any given sub-total section is dynamic and can change any time the code is run. I just do not know how to have VBA locate only the rows in each sub-total section, find the sub-total rows, and run the COUNTIF formula on the proper column with the proper criteria.

After it completes the COUNTIF process, I need VBA to set each sub-total row, columns A through H, to be highlighted in yellow and boldfaced.

A copy of how the sheet is to look is attached.

Any help you can provide on this will be appreciated!
Sample-Account-Spreadsheet.xlsx
Avatar of Jacques Geday
Jacques Geday
Flag of Canada image

Hi here it is

You have 2 options you can run the routine created sepeartly after having produced your subtotal (or ran your vba subtotal) or you can add this line
InsertCOUNTIF
In your vba code to be like this

Sub Macro1()
'
' Macro1 Macro
'
' Keyboard Shortcut: Ctrl+Shift+A
'
    Range("A1").Select
    ActiveWorkbook.Worksheets("December 12").Sort.SortFields.Clear
    ActiveWorkbook.Worksheets("December 12").Sort.SortFields.Add Key:=Range( _
        "D2:D55"), SortOn:=xlSortOnValues, Order:=xlAscending, DataOption:= _
        xlSortNormal
    With ActiveWorkbook.Worksheets("December 12").Sort
        .SetRange Range("A1:H55")
        .Header = xlYes
        .MatchCase = False
        .Orientation = xlTopToBottom
        .SortMethod = xlPinYin
        .Apply
    End With
    Selection.Subtotal GroupBy:=4, Function:=xlCount, TotalList:=Array(4), _
        Replace:=True, PageBreaks:=False, SummaryBelowData:=True
    InsertCOUNTIF
End Sub



Sub InsertCOUNTIF()
Dim WS As Worksheet
Dim MaxRow As Long, I As Long
Dim sRange As String, sFormula As String
Dim lcountif As Long

Set WS = ActiveSheet
MaxRow = WS.Range("C" & WS.Rows.Count).End(xlUp).Row

For I = 2 To MaxRow
    If Left(LCase(WS.Cells(I, "D").Formula), 9) = "=subtotal" Then
        sFormula = WS.Cells(I, "D").Formula
        sRange = Right(sFormula, Len(sFormula) - InStrRev(sFormula, ","))
        sRange = Left(sRange, Len(sRange) - 1)
        
        '---> Update Col E
        sRange = Replace(sRange, "D", "E")
        WS.Cells(I, "E").Formula = "=COUNTIF(" & sRange & "," & Chr(34) & "Y" & Chr(34) & ")"
        
        '---> Update Col F
        sRange = Replace(sRange, "E", "F")
        WS.Cells(I, "F").Formula = "=COUNTIF(" & sRange & "," & Chr(34) & "Y" & Chr(34) & ")"
        
        '---> Update Col H
        sRange = Replace(sRange, "F", "H")
        WS.Cells(I, "H").Formula = "=COUNTIF(" & sRange & "," & Chr(34) & "N" & Chr(34) & ")"
       
        '---> Color Row in Yellow
        WS.Range("A" & I & ":H" & I).Interior.ColorIndex = 6
        WS.Range("A" & I & ":H" & I).Font.Bold = True
        lcountif = lcountif + 1        
    End If
Next I

MsgBox ("A total of " & lcountif & " Rows were updated with COUNTIF formula in Col E,F and H successfully.")

End Sub

Open in new window


I have  attached the workbook with a button starting the countif if you choose the option to do it manually.

I have not included your macro in the workbook attached as it is refering to sheet December12 that does not exist in the workbook.

If you have any question pls do not hesitate to ask.
Rgds/gowflow
Sample-Account-Spreadsheet.xlsm
Avatar of Glenn Stearns

ASKER

Gowflow...

That works beautifully!

I did note that, in the Macro (1), I had used a predefined range of lines 2 through 55 because that is how many lines the sheet had on it. However, with each run of this, there will be a different number of lines on the spreadsheet - could be 25; could be 200. How do I change the code to look for and find all the active lines on the spreadsheet, no matter how many there are, before running the InsertCOUNTIF Sub? Getting past this issue will make the whole code work excellently in any situation. I should have mentioned this in my initial post, but failed to do so. I apologize!

Thanks again!
Glenn
ASKER CERTIFIED SOLUTION
Avatar of Jacques Geday
Jacques Geday
Flag of Canada image

Link to home
membership
This solution is only available to members.
To access this solution, you must be a member of Experts Exchange.
Start Free Trial
Thanks so much! It runs beautifully!