Option Explicit
Private Declare Function FindWindow Lib "user32" Alias "FindWindowA" ( ByVal ClassName As String, ByVal WindowName As String) As Long
Private Declare Function LockWindowUpdate Lib "user32" (ByVal hwndLock As Long) As Long
Public Sub Freeze(Form As UserForm)
Dim hwnd As Long
If Val(Application.Version) >= 9 Then
hwnd = FindWindow("ThunderDFrame", Form.Caption)
Else
hwnd = FindWindow("ThunderXFrame", Form.Caption)
End If
If hwnd > 0 Then LockWindowUpdate hwnd
End Sub
|