VBA 中的多维数组,适用于 Mac 上的 Microsoft Word

Multi-dimensional array in VBA for Microsoft Word on Mac

我正在开发一个宏来循环遍历一系列字符串 (a1, a2, a3) 并将它们替换为一系列相应的值 (b1, b2, b3)。我创建了一个数组来存储要匹配的字符串:

Dim search_strings(1 To 2) As String
search_strings(1) = "match1"
search_strings(2) = "match2"

我可以用 For Each 循环遍历这个数组。但是我不知道如何存储和引用相应的替换文本。我知道我需要某种 key/value 对。我试过使用字典,像这样:

Dim dict As New Scripting.Dictionary
dict.Add "match", "replace"

但要使其正常工作,我需要参考 Microsoft Scripting Runtime,它在 Mac OS X 上不可用。(目前,我收到此错误:Compile error: User-defined type not defined .)

还有其他方法吗?

完整代码如下:

Sub MyMacro()
    ' Initialize variables
    Dim search_strings(1 To 2) As String
    Dim this_search_string As Variant
    Dim myRange As Range
    Dim Reply As Integer
    ' Define strings to match
    search_strings(1) = "match1"
    search_strings(2) = "match2"
    ' Run a search for each string in the array of strings to match
    For Each this_search_string In search_strings
        ' Define the search range to be the whole document
        Set myRange = ActiveDocument.Content
        ' Set the Find parameters
        myRange.Find.ClearFormatting
        myRange.Find.MatchWildcards = True
        ' Loop through each match in the document
        Dim cached As Long
        cached = myRange.End
        Do While myRange.Find.Execute(this_search_string)
            myRange.Select
            ' Prompt the user to replace the match
            Reply = MsgBox("Replace '" & myRange.Find.Text & "'?", vbYesNoCancel)
            If Reply = 6 Then ' "Yes" clicked
                myRange.Text = "replacement"
            ElseIf Reply = 2 Then ' "Cancel" clicked
                Exit Do
            End If
            myRange.Start = myRange.Start + Len(myRange.Find.Text)
            myRange.End = cached
        Loop
    Next this_search_string
End Sub

这可能完全不对,我可能看起来像个傻瓜,但您是否尝试过使用二维数组,以便可以将值及其替换存储在二维数组中。然后您可以循环获取替换值。那只是我的一个想法,它可能还很遥远。

Sub MyMacro()
    ' Initialize variables
    Dim search_strings(1 To 2, 1 to 2) As String
    Dim this_search_string As Variant
    Dim myRange As Range
    Dim Reply As Integer
    ' Define strings to match
    search_strings(1, 1) = "match1"
    search_strings(2, 1) = "match2"
    search_strings(1, 2) = "result"
    search_strings(2, 2) = "result"
    ' Run a search for each string in the array of strings to match
    For Each this_search_string In search_strings
        ' Define the search range to be the whole document
        Set myRange = ActiveDocument.Content
        ' Set the Find parameters
        myRange.Find.ClearFormatting
        myRange.Find.MatchWildcards = True
        ' Loop through each match in the document
        Dim cached As Long
        cached = myRange.End
        Do While myRange.Find.Execute(this_search_string)
            myRange.Select
            ' Prompt the user to replace the match
            Reply = MsgBox("Replace '" & myRange.Find.Text & "'?", vbYesNoCancel)
            If Reply = 6 Then ' "Yes" clicked
                myRange.Text = search_strings(1, 2)
            ElseIf Reply = 2 Then ' "Cancel" clicked
                Exit Do
            End If
            myRange.Start = myRange.Start + Len(myRange.Find.Text)
            myRange.End = cached
        Loop
    Next this_search_string
End Sub

我真的不确定这是否是您要找的,如果浪费您的时间,我深表歉意。