使用 Excel VBA 消息框
Using an Excel VBA msgbox
我有这个代码 运行ning 并且它可以工作,但是对于每个 d 每次都会弹出 MSGBOX。如果回答是,我希望它只 运行 一次,而不是每次都询问。我该如何完成?
For d = 2 To 10
destination_folder = Trim(aw.Worksheets(1).Range("A" & d).Value)
Dim strFileName As String
Dim strFileExists As String
strFileName = destination_folder & monthandyear
strFileExists = Dir(strFileName)
If strFileExists = "" Then
If MsgBox("The file doesn't exist would you like to create one for " & monthandyear & "?", vbYesNo) = vbNo Then Exit Sub
Else
If MsgBox("The selected file exists", vbOKOnly) = vb Then Exit Sub
End If
Set FSO = CreateObject("Scripting.filesystemobject")
FSO.Copyfile (source_folder & source_file), destination_folder & monthandyear, True
Next
End Sub
将消息框的值存储在变量中并检查该值。 6 = 是,7 = 否
For d = 2 To 10
destination_folder = Trim(aw.Worksheets(1).Range("A" & d).Value)
Dim strFileName As String
Dim strFileExists As String
Dim yesno As Long
strFileName = destination_folder & monthandyear
strFileExists = Dir(strFileName)
If strFileExists = "" Then
If Not yesno = 6 Then
yesno = MsgBox("The file doesn't exist would you like to create one for " & monthandyear & "?", vbYesNo)
If yesno = 7 Then Exit Sub
End If
Else
If MsgBox("The selected file exists", vbOKOnly) = vb Then Exit Sub
End If
Set FSO = CreateObject("Scripting.filesystemobject")
FSO.Copyfile (source_folder & source_file), destination_folder & monthandyear, True
Next
我有这个代码 运行ning 并且它可以工作,但是对于每个 d 每次都会弹出 MSGBOX。如果回答是,我希望它只 运行 一次,而不是每次都询问。我该如何完成?
For d = 2 To 10
destination_folder = Trim(aw.Worksheets(1).Range("A" & d).Value)
Dim strFileName As String
Dim strFileExists As String
strFileName = destination_folder & monthandyear
strFileExists = Dir(strFileName)
If strFileExists = "" Then
If MsgBox("The file doesn't exist would you like to create one for " & monthandyear & "?", vbYesNo) = vbNo Then Exit Sub
Else
If MsgBox("The selected file exists", vbOKOnly) = vb Then Exit Sub
End If
Set FSO = CreateObject("Scripting.filesystemobject")
FSO.Copyfile (source_folder & source_file), destination_folder & monthandyear, True
Next
End Sub
将消息框的值存储在变量中并检查该值。 6 = 是,7 = 否
For d = 2 To 10
destination_folder = Trim(aw.Worksheets(1).Range("A" & d).Value)
Dim strFileName As String
Dim strFileExists As String
Dim yesno As Long
strFileName = destination_folder & monthandyear
strFileExists = Dir(strFileName)
If strFileExists = "" Then
If Not yesno = 6 Then
yesno = MsgBox("The file doesn't exist would you like to create one for " & monthandyear & "?", vbYesNo)
If yesno = 7 Then Exit Sub
End If
Else
If MsgBox("The selected file exists", vbOKOnly) = vb Then Exit Sub
End If
Set FSO = CreateObject("Scripting.filesystemobject")
FSO.Copyfile (source_folder & source_file), destination_folder & monthandyear, True
Next