Freeze a window : Windows Resources « Windows API « VBA / Excel / Access / Word






Freeze a window

 

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

 








Related examples in the same category

1.Clipping and Unclipping the Cursor
2.The FindWindow() function finds the first top-level window in the window list that satisfies the specified arguments.
3.Check Whether an Excel File Is Open on a Network
4.Custom About Dialog
5.Disable the X for Closing a Userform
6.Check mouse button
7.Returns the Windows directory
8.Get execuatable file name from a given file name
9.Get screen width and height
10.Get window's rectangle
11.Find window by class name
12.Show Excel Window Size
13.Get color depth
14.Get DC and release it
15.Get user name
16.Get the computer name
17.Change the Excel icon