Link to home
Start Free TrialLog in
Avatar of LouSch7
LouSch7Flag for United States of America

asked on

Excel VBA Macro - Find and Replace all based on RegEx

I need to update ALL prices within a PDF based on a percentage.  To start though I will obviously need to be able to successfully find ALL prices first.  Prices are in the format such as:

5.55
12.35
125.55
etc.

I found the below VBA code courtesy from www.TheSpreadsheetGuru.com however, I do not know how to modify it to search ALL worksheets and to search for a pattern/regex.

Sub FindReplaceAll()

'PURPOSE: Find & Replace text/values throughout entire workbook
'SOURCE: www.TheSpreadsheetGuru.com

Dim sht As Worksheet
Dim fnd As Variant
Dim rplc As Variant

fnd = "April"
rplc = "May"

For Each sht In ActiveWorkbook.Worksheets
  sht.Cells.Replace what:=fnd, Replacement:=rplc, _
    LookAt:=xlPart, SearchOrder:=xlByRows, MatchCase:=False, _
    SearchFormat:=False, ReplaceFormat:=False
Next sht

End Sub

Open in new window

Avatar of aikimark
aikimark
Flag of United States of America image

1. Is the data in a workbook or PDF?
2. What does the regular expression have to do with the problem (given the code you posted)?
3. Do you need to limit your changes to cell text or cell value, which may include the result of a formula?
Avatar of LouSch7

ASKER

Aikimark,

1. The data is in a Workbook

2. Regex is the best way I know how to perform pattern matching; the code posted is simply a stepping stone of how to perform a find and replace within a given worksheet.  I need to expand on that concept and perform a find and replace based on a pattern for the find and a formula for the replace; against the entire workbook.

3. Changes would be limited to cell text, there are no formulas within the workbook at all.
so, let's talk about what you perceive to be the pattern of prices.  I know you've given three examples of prices, but I want you to describe what would separate a price numeric value from a non-price numeric value.
Avatar of LouSch7

ASKER

Akimark,

Solid question.  A price is defined as any number of numeric values, followed by a decimal and two trailing numeric values.  There are no commas and no dollar signs.  There are no other numeric values that match this pattern.

examples:

#####.##
###.##
#.##
Will these numeric values be the only contents of the cell or might they be part of a text string in a cell?
Avatar of LouSch7

ASKER

The cell has no additional text, only the price value.
You can do pattern matching without regular expressions:
Sub Q_28613166()
    Dim rngCell As Range
    Dim rngNumbers As Range
    Dim wks As Worksheet
    For Each wks In ActiveWorkbook.Sheets
        Set rngNumbers = wks.Cells.SpecialCells(xlCellTypeConstants, xlNumbers)
        For Each rngCell In rngNumbers
            If rngCell.Value Like "*#.##" Then
                Debug.Print rngCell.Address, rngCell.Value
            End If
        Next
    Next
End Sub

Open in new window

Avatar of LouSch7

ASKER

Aikmark,

That works beautifully however, apparently some of the "numbers" are actually formatted as text... didn't realize this since it is an 80 tab workbook; your script worked wonders however, it cannot account for values that are not numbers.  Assuming this has to do with the SpecialCells and xlNumbers portion of your script?

Is there a way to look for the pattern within all cells (text as well), the convert (val(rngCell.value) the cell to a number prior to updating it?
please post a workbook with representative data
Avatar of LouSch7

ASKER

Attached is an example with the current macro/vb we are working on.
Update-Price-Excel-Sample.xlsm
ASKER CERTIFIED SOLUTION
Avatar of aikimark
aikimark
Flag of United States of America 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
Avatar of LouSch7

ASKER

Aikmark,

That works wonderfully.

Here is the final code I put together

Sub Q_28613166()
    Dim rngCell As Range
    Dim rngNumbers As Range
    Dim wks As Worksheet
    
    Dim perUpdate As Integer
    
    perUpdate = InputBox("What percentage would you like to increase ALL prices by? (1.1 = 10%)")
    
    Application.ScreenUpdating = False
    For Each wks In ActiveWorkbook.Sheets
        Set rngNumbers = wks.Cells.SpecialCells(xlCellTypeConstants, xlNumbers + xlTextValues)
        For Each rngCell In rngNumbers
            If IsNumeric(rngCell.Value) Then
                If rngCell.Value Like "*#.##" Then
                     rngCell.Value = Format(rngCell.Value * perUpdate, "0.00")
                End If
            End If
        Next
    Next
    Application.ScreenUpdating = True
End Sub

Open in new window

Avatar of LouSch7

ASKER

Aikimark communicated well and provided a 100% solution for the question.