trying to scroll listbox with two commandbutton

patricktoulon1

New Member
Joined
Jan 23, 2025
Messages
46
Office Version
  1. 2013
Platform
  1. Windows
hello i'me trying to scroll a listbox with a commandbutton but that dont work
VBA Code:
Option Explicit

Private Declare Function SendMessage Lib "user32" Alias "SendMessageA" _
                              (ByVal hwnd As Long, ByVal wMsg As Long, ByVal wParam As Long, _
                              lParam As Any) As Long

Private Const WM_VSCROLL = &H115
Const SB_LINEDOWN = 1
Const SB_LINEUP = 0

'event mouseUp for then button  because i need  a listbox focused

Private Sub CommandButton1_MouseUp(ByVal Button As Integer, ByVal Shift As Integer, ByVal X As Single, ByVal Y As Single)
  ListBox1.SetFocus
   SendMessage ListBox1.[_GethWnd], WM_VSCROLL, SB_LINEUP, ByVal 0&

End Sub

Private Sub CommandButton2_MouseUp(ByVal Button As Integer, ByVal Shift As Integer, ByVal X As Single, ByVal Y As Single)
  ListBox1.SetFocus
   SendMessage ListBox1.[_GethWnd], WM_VSCROLL, SB_LINEDOWN, ByVal 0&

End Sub

Private Sub UserForm_Activate()
ListBox1.List = Evaluate("row(1:30)")
End Sub
can you help me please
 
re
I want to scroll the textbox without changing the curlline.
My textbox has 25 visible lines.
With the curline or sendkeys method, scrolling is only effective if the curlline is the first or last visible line.
 
Upvote 0
Ok. I think I see what you mean. You basically want to achieve the same effect as when the user clicks the scrollbar arrows which scrolls the text but doesn't change the textbox current line.
 
Upvote 0
re
Well, actually, it doesn't bother me that the line changes, but what bothers me is that I have to go down to 25 or the first to scroll in one direction or the other.

I had tinkered with a calculation based on the number of visible lines and on the first spin of the wheel (before scrolling) the curline was positioned at the bottom or top depending on the direction of scrolling but it was shaky I abandoned this idea
 
Upvote 0
So you are scrolling the textbox with the mousewheel and you want to be able to scroll one line at a time (or more if you wish so) without the insertion caret jumping.

I think this could be achieved by using the SendInput api with the correct (x,y) mouse pointer location in the api structure argument.
 
Upvote 0
re
The problem with the textbox is that it doesn't have an available handle, so it's complicated from there.

I'll give you my copy with the Scroll Control class module without hooking (because hooking is unstable in VBA).
There's just the problem with the textbox.
VBA Code:
'*****************************************************************************************************
'    ___     _     _______  __      _   ____  _   _  _______  ___     _   _   _    ___     _     _.
'   //  \\  /\\      //    // \\   //  //    //  //    //    //  \\  //  //  //   //  \\  //|   //
'  //___// //__\    //    //__//  //  //    //__//    //    //   // //  //  //   //   // // |  //
' //      //   \\  //    //  \\  //  //    //  \\    //    //   // //  //  //   //   // //  | //
'//      //    // //    //   // //  //___ //    \\  //     \\__// //__//  //___ \\__// //   |//
'****************************************************************************************************
'        MODULE CLASSE DE SCROLLING SUR CONTROLS ACTIVX DANS FEUILLE ET USERFORM SANS HOOKING!!!!!!
'Auteurs:
'@patricktoulon [https://excel-downloads.com/members/patricktoulon.167882/#resources]
'Correcteur de code api @jurassic pork
'version: 4.0  SANS  lES LIBRAIRIES IACCESSIBLE , UIATOMATIONCLIENT , WINDOWFROMPOINT !!!!!!
'date version:22/03/2025
'mise ajour:
'@jurassic pork remplacement de copymemory par une fonction vba pour convertir  le wparam  du message de la souris
'mise a jour 24/03/2025
'transfert du code dans un module classe pour plus de souplesse avec les eventuelles interférences avec des codes vba dans d'autres module
'**************************************************************************************************
'Méthode :
'Instancier une classe dans le userform ou la feuille
'-------------------------------
'Dim cl As New ClScrollControl
'-------------------------------
'Et lancer le scroll a partir du move
'       classe     fonction    control      multiplicateur de pas (qui est 1 à l'origine ou 8 pour les frames et multipage)
' instanceDeClasse.MouseWheel lecontrol, l'accelérateur

'exemple  la frame
'Private Sub Frame1_MouseMove(ByVal Button As Integer, ByVal Shift As Integer, ByVal X As Single, ByVal Y As Single)
'   cl.MouseWheel Frame1, 4
'End Sub
'****************************************************************************************************

Option Explicit
Private Type POINTAPI: X As Long: Y As Long: End Type
Public arx
Public ActualControl As Object
Public multi As Long
Public Ppx#
#If VBA7 Then
    Private Type Msg: hWnd As LongPtr: message As Long: wParam As LongPtr: lParam As LongPtr: time As Long: pt As POINTAPI: End Type
    Private Declare PtrSafe Function PeekMessage Lib "user32" Alias "PeekMessageA" (lpMsg As Msg, ByVal hWnd As LongPtr, ByVal wMsgFilterMin As Long, ByVal wMsgFilterMax As Long, ByVal wRemoveMsg As Long) As Long
    Private Declare PtrSafe Function WaitMessage Lib "user32" () As Long
    Private Declare PtrSafe Function GetCursorPos Lib "user32" (lpPoint As POINTAPI) As Long
    #If Win64 Then
        Const NULL_PTR = 0
    #Else
        Const NULL_PTR = 0&
    #End If
    'remplacant de copymemory
    Private Function HIWORD(ByVal LongIn As LongPtr) As Integer
        On Error Resume Next
        HIWORD = (CLng(LongIn) And (&HFFFF0000)) \ (&H10000)
        On Error GoTo 0
    End Function
#Else
    Private Const NULL_PTR = 0&
    Private Declare Function PeekMessage Lib "user32" Alias "PeekMessageA" (lpMsg As Msg, ByVal hWnd As Long, ByVal wMsgFilterMin As Long, ByVal wMsgFilterMax As Long, ByVal wRemoveMsg As Long) As Long
    Private Declare Function WaitMessage Lib "user32" () As Long
    Private Declare Function GetCursorPos Lib "user32" (lpPoint As POINTAPI) As Long
    Private Type Msg: hWnd As Long: message As Long: wParam As Long: lParam As Long: time As Long: pt As POINTAPI: End Type
    'remplacant de copymemory
    Private Function HIWORD(ByVal LongIn As Long) As Integer
        HIWORD = (LongIn And (&HFFFF0000)) \ (&H10000)
    End Function
#End If
'Fonction Point/Pixels
Public Function PixelToPoint()
    Dim z#
    With ActiveWindow.Panes(1)
        z = .Parent.Zoom / 100
        PixelToPoint = 1 / ((.PointsToScreenPixelsX(7200 / z) - .PointsToScreenPixelsX(0)) / 7200)
    End With
End Function
'Fonction qui control si le control est scrollable
Public Function IsScrollable(Ctrl As Object)
    Dim pos As POINTAPI, yyy&
    GetCursorPos pos
    On Error Resume Next
    If TypeOf Ctrl Is ComboBox Then DoEvents: yyy = (Ctrl.Font.Size * 1.2) * Ctrl.ListRows / Ppx
    On Error GoTo 0
    IsScrollable = True
   If IsArray(arx) Then
   If (pos.X < arx(1) Or pos.Y < arx(2) Or pos.X > arx(3) Or pos.Y > arx(4) + yyy) Then
        [b1] = "Sortie" 'Ligne à supprimer
       DoEvents: IsScrollable = False
    End If
End If
End Function

'Fonction de demarrage au mlancer au move du control
Public Sub MouseWheel(Ctrl As Object, Optional fois As Long = 1, Optional ControlRelease As Boolean = False)
    Const WM_MOUSEWHEEL = &H20A, PM_NOREMOVE = &H0&
    Dim tMsg As Msg, lDelta As Integer, criter As Boolean, Onsheet As Boolean, stp As Boolean, fin As Boolean, cc, p
    multi = fois
    Ppx = PixelToPoint
    If ActualControl Is Ctrl Then Exit Sub
    Set ActualControl = Ctrl
    If ActualControl.Parent Is ActiveSheet Then
       DoEvents
       Onsheet = True: arx = GetRectangle(ActualControl)
    Else
       DoEvents
       Onsheet = False
        If TypeName(ActualControl) = "Page" Then arx = GetUfRectangle(ActualControl.Parent) Else arx = GetUfRectangle(ActualControl)
    End If
    If TypeName(Ctrl) = "TextBox" Then
      
      On Error Resume Next
      cc = Ctrl.CurLine
      p = Err.Number
      On Error GoTo 0
      If Onsheet Then Ctrl.Activate Else Ctrl.SetFocus
        If p <> 0 Then Ctrl.CurLine = 0
    End If
    'On Error Resume Next
    If ActualControl Is Nothing Then Exit Sub
    If Onsheet And Not ActualControl Is Nothing Then ActiveSheet.ScrollArea = ActualControl.TopLeftCell.Address
    If TypeOf ActualControl Is ComboBox Then If ActualControl.TopIndex = -1 Then ActiveSheet.ScrollArea = "": Set ActualControl = Nothing: stp = True: Exit Sub
    
    '[b1].Resize(, 6) = Array("DEDANS", ActualControl.Name, arx(1), arx(2), arx(3), arx(4)) 'ligne a supprimer
    Do
        criter = IsScrollable(ActualControl)
        If Not criter Then
            If Onsheet Then ActiveSheet.ScrollArea = ""
            [b1] = "DEHORS": [C1] = "": [d1].Resize(, 4) = "" 'ligne a supprimer
            If ControlRelease Then fin = ReleaseControl(ActualControl, Onsheet)
            Set ActualControl = Nothing
           arx = ""
           Exit Do
        End If
        Call WaitMessage
        If PeekMessage(tMsg, NULL_PTR, WM_MOUSEWHEEL, WM_MOUSEWHEEL, PM_NOREMOVE) Then
            lDelta = HIWORD(tMsg.wParam)
            scrolling lDelta, ActualControl, Onsheet
        End If
        DoEvents
    Loop
End Sub
'fonction rectangle control  sur feuille
Public Function GetRectangle(control As Object)
    Dim z#, ar(1 To 4), pos As POINTAPI, pan, ipan&, q&
    On Error Resume Next
    GetCursorPos pos
    ipan = 1
    With ActiveWindow
        If .Panes.Count >= 2 Then If pos.X > .Panes(2).PointsToScreenPixelsX(.Panes(2).VisibleRange.Left) Then ipan = 2
        If .Panes.Count >= 2 Then If pos.Y < .Panes(2).PointsToScreenPixelsY(.Panes(2).VisibleRange.Top) Then ipan = 1
        If .Panes.Count = 4 Then If pos.Y > .Panes(3).PointsToScreenPixelsY(.Panes(3).VisibleRange.Top) Then ipan = ipan + 2
    End With
    With ActiveWindow.Panes(ipan)
        ar(1) = .PointsToScreenPixelsX(control.Left)
        ar(2) = .PointsToScreenPixelsY(control.Top)
        ar(3) = .PointsToScreenPixelsX(control.Left + (control.Width))
        ar(4) = .PointsToScreenPixelsY(control.Top + (control.Height))
    End With
    GetRectangle = ar
End Function

'fonction rectangle control dans userform
Public Function GetUfRectangle(obj As Object)
    'fonction de positionement calendar reconvertie :patricktoulon calendar
    On Error Resume Next
    If Not obj Is Nothing Then
        Dim Lft As Double, Ltop As Double, p As Object, PInsWidth As Double, PInsHeight As Double, tt As Double, ar(1 To 4) As Long
        Dim K As Double, A, z
        Lft = obj.Left: Ltop = obj.Top: Set p = obj.Parent
        Do
            PInsWidth = p.InsideWidth ' Le Page en est pourvu, mais pas le Multipage.
            PInsHeight = p.InsideHeight
            If TypeOf p Is MSForms.Page Then Set p = p.Parent ' Prend le Multipage, car le Page est sans positionnement.
            K = (p.Width - PInsWidth) / 2: Lft = (Lft + p.Left + K): Ltop = (Ltop + p.Top + p.Height - K - PInsHeight)
            If Not (TypeOf p Is MSForms.Frame Or TypeOf p Is MSForms.MultiPage) Then Exit Do
            Set p = p.Parent
            DoEvents
        Loop
        ar(1) = Lft / Ppx: ar(2) = Ltop / Ppx: ar(3) = (Lft + obj.Width) / Ppx: ar(4) = (Ltop + obj.Height) / Ppx
        GetUfRectangle = ar
    End If
End Function
'sub de scrolling selon le control
Public Sub scrolling(lDelta, control, Optional Onsheet As Boolean = False)
    Select Case TypeName(control)
        Case "Frame", "Page", "UserForm"
            If lDelta > 0& Then
                control.ScrollTop = Application.Max(control.ScrollTop - (8 * multi), 0)
            Else
                control.ScrollTop = Application.Min(control.ScrollTop + (8 * multi), control.ScrollHeight)
            End If
        Case "ListBox", "ComboBox"
            On Error Resume Next
            If lDelta > 0& Then
                control.TopIndex = Application.Max(control.TopIndex - (1 * multi), 0)
            Else
                control.TopIndex = Application.Min(control.TopIndex + (1 * multi), control.ListCount - 1)
            End If
            On Error GoTo 0
        Case "TextBox"
            If Onsheet Then control.Activate Else control.SetFocus
            If lDelta > 0& Then
                control.CurLine = Application.Max(0, control.CurLine - 1)
            Else
                control.CurLine = Application.Min(control.LineCount - 1, control.CurLine + 1)
            End If
         End Select
End Sub

'Fonction pour relacher replier la combobox  quand on sort de son périmètre
Public Function ReleaseControl(control, Onsheet)
    If Not control Is Nothing Then
        Dim Txt, ct
        If Onsheet Then control.TopLeftCell.Select: Exit Function
        If TypeName(control) = "Page" Then Set ct = control.Parent Else Set ct = control
        With ct.Parent
            Set Txt = .Controls.Add("Forms.TextBox.1", "xx", True)
            Txt.SetFocus
            .Controls.Remove "xx"
        End With
    End If
    ReleaseControl = True
End Function
 
Upvote 0
The problem with the textbox is that it doesn't have an available handle, so it's complicated from there.
That's true. So the only workaround that I can think of is to determine the location of the scrollbar arrows and use SendInput at each mouse-wheel scroll.
without hooking (because hooking is unstable in VBA).
I know, I have used PeekMessage api myself. I have posted various working codes here over the past years. It is more stable than setting up a windows mouse hook.

Cristian Buse, a member here, has written an excelent code/project for mousewheel scrolling userforms/controls . He uses a Windows hook but, the code is very stable ... You may want to take a look here:

I am not sure, if his code will work well for your textbox specific needs as discussed here but, it is worth taking a look.
 
Upvote 0
re
Ok, I know this principle
and it has a major flaw, like several examples found online: on some less powerful PCs, the scrolling is jerky.

10 wheel notches for 5/6 effective only and if you scroll faster it's less

although it apparently handles the asynchrony between the user and the looping of the parameter hook well.

in my simple model there is only the test "criter" which interferes in the looping that is why I capture the wparam better and more often with the peekmessage 8/10
 
Upvote 0
Ok. I have done some further research and found out that the reason the textbox caret jumps when using Send/PostMessage with WM_LBUTTONDOWN is because this activates the textbox. This message is preceeded by the WM_MOUSEACTIVATE message. (You can clearly see this if you use SPY++)

Raymond Chen from MS, discusses this here
From the article, we can see that apparently, the only way to make a window (in this case our userform client window) recieve input without being activated is by subclassing it and returning MA_NOACTIVATE in response to the WM_MOUSEACTIVATE message in the window procedure.

Unfortunately, we don't want to subclass the userform, therefore we are out of luck.

But like I said, with a bit of trickery, we should be able to achieve a decent result using IAccessibility+ SendInput + Get/SetCursorPos.

I will write an example later on and see how it goes.
 
Last edited:
Upvote 0
Hi Patrick,

I have just finished writing this drop in Class which can be used to vertically scroll textboxes on userforms without selecting any text or altering the Curline ... It uses the SendInput trick I spoke about in my previous post ... In order to keep the usage of the Class as user friendly & flexible as possible, I decided to design it in such a way that we only need to instanciate it once and then pass to it the textboxes and their respective scrollines in two arrays as shown in the below code.

The Class client ( ie: the userform) can consume the generic mouse-wheel scroll event after the instance variable is declared with the WithEvents keyword.

The code turned out to be more of a little project than I expected ... I guess it will require some effort to incorporate the code logic into your existing class.

Workbook Example:
ScrollTextBox_V1.xlsm





1- Class Code : CWheelScroll
VBA Code:
Option Explicit

Implements IPrivateMembers

Private WithEvents oTextBox As MSForms.TextBox
Private WithEvents oCmndBars As CommandBars

Public Event ScrollEvent( _
    ByVal TextBox As MSForms.TextBox, _
    ByVal ScrollLines As Long, _
    ByVal ScrollDirection As SROLL_DIRECTION, _
    ByVal Rotations As Long, _
    ByVal CtrlShiftKeys As KEYS_STATUS, _
    ByVal X As Single, _
    ByVal Y As Single, _
    ByRef Cancel As Boolean _
)

#If VBA7 Then
    #If Win64 Then
        Private Declare PtrSafe Function WindowFromPoint Lib "user32" (ByVal Point As LongPtr) As LongPtr
        Private Declare PtrSafe Function AccessibleObjectFromPoint Lib "oleacc" (ByVal arg1 As LongPtr, ppacc As Any, pvarChild As Variant) As Long
    #Else
        Private Declare PtrSafe Function WindowFromPoint Lib "user32" (ByVal xPoint As Long, ByVal yPoint As Long) As LongPtr
        Private Declare PtrSafe Function AccessibleObjectFromPoint Lib "oleacc" (ByVal X As Long, ByVal Y As Long, ppacc As Any, pvarChild As Variant) As Long
    #End If
    Private Declare PtrSafe Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As LongPtr)
    Private Declare PtrSafe Function IsBadCodePtr Lib "kernel32" (ByVal lpfn As LongPtr) As Long
    Private Declare PtrSafe Function CoLockObjectExternal Lib "OLE32.DLL" (ByVal pUnk As IUnknown, ByVal fLock As Boolean, Optional ByVal fLastUnlockReleases As Boolean) As Long
    Private Declare PtrSafe Function IUnknown_GetWindow Lib "shlwapi" Alias "#172" (ByVal pIUnk As IUnknown, ByVal hUf As LongPtr) As Long
    Private Declare PtrSafe Function IsWindow Lib "user32" (ByVal hwnd As LongPtr) As Long
    Private Declare PtrSafe Function GetAncestor Lib "user32" (ByVal hUf As LongPtr, ByVal gaFlags As Long) As LongPtr
    Private Declare PtrSafe Function PeekMessage Lib "user32" Alias "PeekMessageA" (lpMsg As Msg, ByVal hwnd As LongPtr, ByVal wMsgFilterMin As Long, ByVal wMsgFilterMax As Long, ByVal wRemoveMsg As Long) As Long
    Private Declare PtrSafe Function WaitMessage Lib "user32" () As Long
    Private Declare PtrSafe Function SystemParametersInfo Lib "user32" Alias "SystemParametersInfoA" (ByVal uAction As Long, ByVal uParam As Long, ByRef lpvParam As Any, ByVal fuWinIni As Long) As Long
    Private Declare PtrSafe Function GetSystemMetrics Lib "user32" (ByVal nIndex As Long) As Long
    Private Declare PtrSafe Function SetProp Lib "user32" Alias "SetPropA" (ByVal hwnd As LongPtr, ByVal lpString As String, ByVal hData As LongPtr) As Long
    Private Declare PtrSafe Function GetProp Lib "user32" Alias "GetPropA" (ByVal hwnd As LongPtr, ByVal lpString As String) As LongPtr
    Private Declare PtrSafe Function RemoveProp Lib "user32" Alias "RemovePropA" (ByVal hwnd As LongPtr, ByVal lpString As String) As LongPtr
    Private Declare PtrSafe Function SendInput Lib "user32.dll" (ByVal nInputs As Long, pInputs As Any, ByVal cbSize As Long) As Long
    Private Declare PtrSafe Function SetCursorPos Lib "user32.dll" (ByVal X As Long, ByVal Y As Long) As Long
    Private Declare PtrSafe Function ShowCursor Lib "user32" (ByVal bShow As Long) As Long
    Private Declare PtrSafe Function GetCursorPos Lib "user32.dll" (lpPoint As POINTAPI) As Long
    Private Declare PtrSafe Function EqualRect Lib "user32" (lpRect1 As RECT, lpRect2 As RECT) As Long
#Else
    Private Enum LongPtr
        [_]
    End Enum
    Private Declare Function WindowFromPoint Lib "user32" (ByVal xPoint As Long, ByVal yPoint As Long) As LongPtr
    Private Declare Function AccessibleObjectFromPoint Lib "oleacc" (ByVal X As Long, ByVal Y As Long, ppacc As Any, pvarChild As Variant) As Long
    Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As LongPtr)
    Private Declare Function IsBadCodePtr Lib "kernel32" (ByVal lpfn As LongPtr) As Long
    Private Declare Function CoLockObjectExternal Lib "OLE32.DLL" (ByVal pUnk As IUnknown, ByVal fLock As Boolean, Optional ByVal fLastUnlockReleases As Boolean) As Long
    Private Declare Function IUnknown_GetWindow Lib "shlwapi" Alias "#172" (ByVal pIUnk As IUnknown, ByVal hUF As LongPtr) As Long
    Private Declare Function IsWindow Lib "user32" (ByVal hwnd As LongPtr) As Long
    Private Declare Function GetAncestor Lib "user32" (ByVal hUf As LongPtr, ByVal gaFlags As Long) As LongPtr
    Private Declare Function PeekMessage Lib "user32" Alias "PeekMessageA" (lpMsg As Msg, ByVal hwnd As LongPtr, ByVal wMsgFilterMin As Long, ByVal wMsgFilterMax As Long, ByVal wRemoveMsg As Long) As Long
    Private Declare Function WaitMessage Lib "user32" () As Long
    Private Declare Function SystemParametersInfo Lib "user32" Alias "SystemParametersInfoA" (ByVal uAction As Long, ByVal uParam As Long, ByRef lpvParam As Any, ByVal fuWinIni As Long) As Long
    Private Declare Function GetSystemMetrics Lib "user32" (ByVal nIndex As Long) As Long
    Private Declare Function SetProp Lib "user32" Alias "SetPropA" (ByVal hwnd As LongPtr, ByVal lpString As String, ByVal hData As LongPtr) As Long
    Private Declare Function GetProp Lib "user32" Alias "GetPropA" (ByVal hwnd As LongPtr, ByVal lpString As String) As LongPtr
    Private Declare Function RemoveProp Lib "user32" Alias "RemovePropA" (ByVal hwnd As LongPtr, ByVal lpString As String) As LongPtr
    Private Declare Function SendInput Lib "user32.dll" (ByVal nInputs As Long, pInputs As Any, ByVal cbSize As Long) As Long
    Private Declare Function SetCursorPos Lib "user32.dll" (ByVal X As Long, ByVal Y As Long) As Long
    Private Declare Function ShowCursor Lib "user32" (ByVal bShow As Long) As Long
    Private Declare Function GetCursorPos Lib "user32.dll" (lpPoint As POINTAPI) As Long
    Private Declare Function EqualRect Lib "user32" (lpRect1 As RECT, lpRect2 As RECT) As Long
#End If

Public Enum SROLL_DIRECTION
    Forward
    Backward
End Enum

Public Enum KEYS_STATUS
    None
    Ctrl
    Shift
    Ctrl_Shift
End Enum

#If Win64 Then
    Private Const NULL_PTR = 0^
    Private Const PTR_SIZE = 8&
#Else
    Private Const NULL_PTR = 0&
    Private Const PTR_SIZE = 4&
#End If

Private Type POINTAPI
    X As Long
    Y As Long
End Type

Private Type RECT
    Left As Long
    Top As Long
    Right As Long
    Bottom As Long
End Type

Private Type Msg
    hwnd As LongPtr
    message As Long
    wParam As LongPtr
    lParam As LongPtr
    time As Long
    pt As POINTAPI
End Type

Private Type TAG_MOUSEINPUT
    dx As Long
    dy As Long
    mouseData As Long
    dwFlags As Long
    time As Long
    dwExtraInfo As LongPtr
End Type

Private Type MOUSE_INPUT
    type As Long
    mi As TAG_MOUSEINPUT
End Type

Private oForm As Object
Private bMouseOverControl As Boolean
Private nScrollLines As Long
Private XCord As Single, YCord As Single



' ________________________________________ Class Public Members ___________________________________
    
Public Sub Init(ByVal Form As Object)

    Dim hwnd As LongPtr
    If IsMouseWheelEnabled Then MsgBox "MouseWheel Scrolling already enabled!": Exit Sub
    Call IUnknown_GetWindow(Form, VarPtr(hwnd))
    Set oForm = Form
    SetProp Application.hwnd, "Hwnd", hwnd
    SetProp GetProp(Application.hwnd, "Hwnd"), "Enabled", 1&
    
End Sub

Public Sub EnableMouseWheelScroll(ByVal TextBoxesArray As Variant, ByVal ScrollLinesArray As Variant)

    Dim oMouseWheel  As CWheelScroll
    Dim IProperties As IPrivateMembers
    Dim i As Long

    If TypeName(TextBoxesArray) = "TextBox" Then
        Set oForm = GetUserForm(TextBoxesArray)
        SetProp GetProp(Application.hwnd, "Hwnd"), "TextBoxesCount", GetProp(GetProp(Application.hwnd, "Hwnd"), "TextBoxesCount") + 1
    End If
    If IsArray(TextBoxesArray) And IsArray(ScrollLinesArray) Then
        If UBound(TextBoxesArray) <> UBound(ScrollLinesArray) Then
            Call DisableMouseWheelScroll
            MsgBox "TextBoxes and ScrollLines arrays must be identical in their lengths.", , "Error"
            Exit Sub
        End If
        ' Cache all textboxes and their respective scroll lines in the userform window property list.
        ' We will need theses cached values when disabling the wheelscroll & when closing the userform.
        For i = LBound(TextBoxesArray) To UBound(TextBoxesArray)
            SetProp GetProp(Application.hwnd, "Hwnd"), "Hwnd", 1&
            ' Create a new class instance for each TextBox since they were not intanciated by the caller of the class.
            Set oMouseWheel = New CWheelScroll
            ' keep instances in memory so as not to go out of scope.
            Call CoLockObjectExternal(oMouseWheel, True)
            ' Cast the newly created instance to the IPrivateMembers interface.
            Set IProperties = oMouseWheel
            ' Cache the values now.
            IProperties.ScrollLines = ScrollLinesArray(i)
            Set IProperties.TextBox = TextBoxesArray(i)
            IProperties.ScrollLines = ScrollLinesArray(i)
            Set IProperties.TextBox = TextBoxesArray(i)
            ' Enable the mousewheel scrolling for each Textbox.
            oMouseWheel.EnableMouseWheelScroll TextBoxesArray(i), ScrollLinesArray(i)
            SetProp GetProp(Application.hwnd, "Hwnd"), "Tag" & i, ObjPtr(oMouseWheel)
        Next i
    End If
    'Hook the commandbars to intercept the userform closing event (can't use withevents)
    Set oCmndBars = Application.CommandBars
    Call oCmndBars_OnUpdate
 
End Sub

Public Property Get IsMouseWheelEnabled() As Boolean
    IsMouseWheelEnabled = (GetProp(GetProp(Application.hwnd, "Hwnd"), "Enabled"))
End Property

Public Sub DisableMouseWheelScroll()

    Dim oTemp As Object
    Dim lProp As LongPtr, i As Long
    
    ' This is to force-trigger a commandbars update event.
    Application.DisplayFullScreen = Application.DisplayFullScreen
    
    ' Don't hook twice.
    If IsMouseWheelEnabled = False Then MsgBox "MouseWheel Scrolling already disabled!": Exit Sub
    
    'Restore all the cahed values from the userform window property list.
    If GetProp(Application.hwnd, "Hwnd") Then
        For i = 0& To CLng(GetProp(GetProp(Application.hwnd, "Hwnd"), "TextBoxesCount"))
            lProp = GetProp(GetProp(Application.hwnd, "Hwnd"), "Tag" & i)
            If lProp And IsBadCodePtr(lProp) = 0& Then
                ' release the memory.
                CopyMemory oTemp, lProp, PTR_SIZE
                Call CoLockObjectExternal(oTemp, False)
                CopyMemory oTemp, 0&, PTR_SIZE
                Set oTemp = Nothing
                RemoveProp GetProp(Application.hwnd, "Hwnd"), GetProp(GetProp(Application.hwnd, "Hwnd"), "Tag" & i)
            End If
        Next i
        Call CoLockObjectExternal(Me, False)
        RemoveProp GetProp(Application.hwnd, "Hwnd"), "TextBoxesCount"
        RemoveProp GetProp(Application.hwnd, "Hwnd"), "Enabled"
        RemoveProp Application.hwnd, "Hwnd"
    End If

End Sub


' ________________________________________ Interface Members ___________________________________
Private Property Let IPrivateMembers_ScrollLines(ByVal RHS As Long)
    nScrollLines = RHS
End Property

Private Property Set IPrivateMembers_TextBox(ByVal RHS As MSForms.IMdcText)
    Set oTextBox = RHS
End Property

Private Sub Class_Terminate()
    If Not oTextBox Is Nothing Then
        Debug.Print ObjPtr(oTextBox), "Memory properly released."
    End If
End Sub


' ________________________________________ Class Private Members ___________________________________


Private Sub oTextBox_MouseMove( _
    ByVal Button As Integer, _
    ByVal Shift As Integer, _
    ByVal X As Single, _
    ByVal Y As Single _
)

    XCord = X:  YCord = Y
    If bMouseOverControl Then Exit Sub
    bMouseOverControl = True
    Call MonitorMouseWheel(oTextBox)
    bMouseOverControl = False

End Sub

Private Sub MonitorMouseWheel(ByVal TextBox As MSForms.TextBox)

    Const WHEEL_DELTA = 120&, MK_CONTROL = &H8, MK_SHIFT = &H4
    Const WM_MOUSEWHEEL = &H20A, SPI_GETWHEELSCROLLLINES = &H68
    Const PM_NOREMOVE = &H0, SM_CXHTHUMB = 10&, GA_ROOT = 2&

    #If Win64 Then
        Dim nDelta As Long, nVKey As Long
    #Else
        Dim nDelta As Integer, nVKey As Integer
    #End If
    Dim bCancel As Boolean
    Dim eScrollDirection As SROLL_DIRECTION
    Dim eKeys As KEYS_STATUS
    Dim lScrollBarWidth As Long, lRotations As Long
    Dim lAccumulatedDelta  As Currency
    Dim tMsg As Msg
    Dim uRect As RECT, R1 As RECT, R2 As RECT
    Dim uP1 As POINTAPI, uP2 As POINTAPI
    Dim iAcc As IAccessible

    On Error Resume Next
 
    ' Needed in case of a modeless userform.
    Application.EnableCancelKey = xlDisabled
 
    R1 = GetControlRect
    
    Do
        If oForm Is Nothing Then Exit Do
        Set oForm.MouseWheel = Me
    
        R2 = GetControlRect
        If EqualRect(R1, R2) = 0& Then Exit Do
            
            WaitMessage
            If PeekMessage(tMsg, NULL_PTR, WM_MOUSEWHEEL, WM_MOUSEWHEEL, PM_NOREMOVE) Then
                
                #If Win64 Then
                    nDelta = HiWord64(tMsg.wParam):  nVKey = LoWord64(tMsg.wParam)
                #Else
                    nDelta = HiWord32(tMsg.wParam):  nVKey = LoWord32(tMsg.wParam)
                #End If
            
                If nDelta * lAccumulatedDelta > 0& Then
                    lAccumulatedDelta = lAccumulatedDelta + nDelta
                Else
                    lAccumulatedDelta = nDelta
                End If
                
                If nScrollLines <= 0& Then
                    If SystemParametersInfo(SPI_GETWHEELSCROLLLINES, 0&, nScrollLines, 0&) = 0& Then
                        nScrollLines = 3&
                    End If
                End If

                lRotations = lAccumulatedDelta \ nDelta
                lRotations = IIf(lAccumulatedDelta > 0&, lRotations, -(lRotations))
              
                eScrollDirection = IIf(lRotations > 0&, Forward, Backward)
    
                If (nVKey And (MK_CONTROL Or MK_SHIFT)) = (MK_CONTROL Or MK_SHIFT) Then
                    eKeys = Ctrl_Shift
                ElseIf nVKey And MK_SHIFT Then
                    eKeys = Shift
                ElseIf nVKey And MK_CONTROL Then
                    eKeys = Ctrl
                Else
                    eKeys = None
                End If
    
                ' Execute scroll callback event.
                RaiseEvent ScrollEvent( _
                    oTextBox, _
                    nScrollLines, _
                    eScrollDirection, _
                    lRotations, _
                    eKeys, _
                    XCord, _
                    YCord, _
                    bCancel _
                )
    
                ' Perform the scrolling if the 'Cancel' argument in the event callback is False.
                If bCancel = False Then
                    Set iAcc = TextBox
                    lScrollBarWidth = GetSystemMetrics(SM_CXHTHUMB)
                    With uRect
                        iAcc.accLocation .Left, .Top, .Right, .Bottom
                        .Left = .Right + .Left - lScrollBarWidth
                        .Right = .Left + lScrollBarWidth
                        .Bottom = .Bottom + .Top
                    End With
                    With uRect
                        uP1.X = .Left + 5&:   uP1.Y = .Top + lScrollBarWidth / 2&
                        uP2.X = .Right - lScrollBarWidth + 5&: uP2.Y = .Bottom - lScrollBarWidth + 5&
                    End With
                    
                    If eScrollDirection = Forward Then
                        If GetAncestor(WndFromPoint(uP1.X, uP1.Y), GA_ROOT) = GetProp(Application.hwnd, "Hwnd") Then
                            Call ClickAtPosition(uP1.X, uP1.Y, nScrollLines)
                        End If
                    Else
                        If GetAncestor(WndFromPoint(uP2.X, uP2.Y), GA_ROOT) = GetProp(Application.hwnd, "Hwnd") Then
                            Call ClickAtPosition(uP2.X, uP2.Y, nScrollLines)
                        End If
                    End If
                    
                End If
        End If
        
        DoEvents
    Loop

End Sub

Private Sub ClickAtPosition(ByVal X As Long, ByVal Y As Long, Optional ByVal ScrollLines As Long = 1&)

    Const MOUSEEVENTF_LEFTDOWN = &H2, MOUSEEVENTF_LEFTUP = &H4
    ReDim uInput(2&) As MOUSE_INPUT
    Dim uCurPos As POINTAPI, i As Long

    GetCursorPos uCurPos
    ShowCursor 0&
    SetCursorPos X, Y
    For i = 0& To ScrollLines - 1&
        With uInput(0&)
            .type = 0&
            .mi.dx = X
            .mi.dy = Y
            .mi.mouseData = 0&
            .mi.dwFlags = MOUSEEVENTF_LEFTDOWN
        End With
        With uInput(1&)
            .type = 0&
            .mi.dx = X
            .mi.dy = Y
            .mi.mouseData = 0&
            .mi.dwFlags = MOUSEEVENTF_LEFTUP
        End With
        Call SendInput(2&, uInput(0&), LenB(uInput(0&)))
    Next i
    SetCursorPos uCurPos.X, uCurPos.Y
    ShowCursor -1&

End Sub

Private Function GetUserForm(ByVal Ctrl As MSForms.Control) As Object
    Dim oTmp As Object
    Set oTmp = Ctrl.Parent
    Do While TypeOf oTmp Is MSForms.Control
        Set oTmp = oTmp.Parent
    Loop
    Set GetUserForm = oTmp
End Function

Private Function GetControlRect() As RECT
    Dim tCurPos As POINTAPI, iAcc As IAccessible
    Call GetCursorPos(tCurPos)
    #If Win64 Then
        Dim lPt2 As LongLong
        Call CopyMemory(lPt2, tCurPos, LenB(tCurPos))
        Call AccessibleObjectFromPoint(lPt2, iAcc, 0&)
    #Else
        Call AccessibleObjectFromPoint(tCurPos.X, tCurPos.Y, iAcc, 0&)
    #End If
    With GetControlRect
        iAcc.accLocation .Left, .Top, .Right, .Bottom
    End With
End Function

Private Function WndFromPoint(ByVal X As Long, ByVal Y As Long) As LongPtr
    Dim tPt As POINTAPI
    tPt.X = X: tPt.Y = Y
    #If Win64 Then
        Dim Ptr As LongLong
        Call CopyMemory(Ptr, tPt, LenB(tPt))
        WndFromPoint = WindowFromPoint(Ptr)
    #Else
        WndFromPoint = WindowFromPoint(tPt.X, tPt.Y)
    #End If
End Function

Private Sub oCmndBars_OnUpdate()
    If IsWindow(GetProp(Application.hwnd, "Hwnd")) = 0 Then
        Set oCmndBars = Nothing
        Set oForm = Nothing
        Call CoLockObjectExternal(Me, False)
    End If
End Sub

Private Function HiWord64(ByVal DWord As LongPtr) As Long
        CopyMemory HiWord64, ByVal VarPtr(DWord) + 2&, 4&
End Function

Private Function LoWord64(ByVal DWord As LongPtr) As Long
    CopyMemory LoWord64, DWord, 4&
End Function

Private Function HiWord32(ByVal Word As Long) As Integer
        CopyMemory HiWord32, ByVal VarPtr(Word) + 2&, 2&
End Function

Private Function LoWord32(ByVal Word As Long) As Integer
    CopyMemory LoWord32, Word, 2&
End Function

2- IPrivateMembers Interface:
VBA Code:
Option Explicit

Public Property Set TextBox(ByVal vNewValue As MSForms.TextBox)
    '
End Property

Public Property Let ScrollLines(ByVal vNewValue As Long)
    '
End Property

3- Code Usage Example in the UserForm Module:
VBA Code:
Option Explicit

Public WithEvents MouseWheel As CWheelScroll

Private Sub UserForm_Initialize()
    Call Start
End Sub

Private Sub CheckBox1_Change()
    If CheckBox1 And MouseWheel.IsMouseWheelEnabled = False Then
        Call Start
    ElseIf CheckBox1 = False And MouseWheel.IsMouseWheelEnabled Then
        Call Finish
    End If
End Sub


Private Sub Start()
    Dim i As Long
    
    Dim vTextBoxes As Variant, vScrollLines As Variant

    ' Initial Textboxes setup to to display the vertical scrollbars.
    For i = 4& To 1& Step -1&
        Controls("TextBox" & i).SetFocus
        Controls("TextBox" & i).CurLine = 0&
    Next i
 
    ' Instanciate the CWheelScroll class.
    Set MouseWheel = New CWheelScroll
    
    ' Set up arrays for the Textboxes and their respective
    ' number of lines to scroll per rotation.
    vTextBoxes = Array(TextBox1, TextBox2, TextBox3, TextBox4)
    vScrollLines = Array(1, 10, 4, 6)
    
    ' Initiate class instance and enable wheel-scrolling.
    With MouseWheel
       .Init Form:=Me
       .EnableMouseWheelScroll TextBoxesArray:=vTextBoxes, ScrollLinesArray:=vScrollLines
    End With
    
    CheckBox1.Value = MouseWheel.IsMouseWheelEnabled

End Sub

Private Sub Finish()
    MouseWheel.DisableMouseWheelScroll
End Sub



' ------------------------------------- Generic event handler -------------------------------------------
Private Sub MouseWheel_ScrollEvent( _
    ByVal TextBox As MSForms.TextBox, _
    ByVal ScrollLines As Long, _
    ByVal ScrollDirection As Long, _
    ByVal Rotations As Long, _
    ByVal CtrlShiftKeys As Long, _
    ByVal X As Single, _
    ByVal Y As Single, _
    ByRef Cancel As Boolean _
)

    ' Skip TextBox4
    If TextBox Is TextBox4 Then Cancel = True

    Label10 = Cancel
    Label11 = Y
    Label12 = X
    Label13 = CtrlShiftKeys
    Label14 = Rotations
    Label15 = ScrollDirection
    Label16 = ScrollLines
    Label17 = TextBox.Name

End Sub

Tested in excel 2013 x32bit and excel 2016 x64bit on Windows 10 x64bit.
 
Upvote 0

We've detected that you are using an adblocker.

We have a great community of people providing Excel help here, but the hosting costs are enormous. You can help keep this site running by allowing ads on MrExcel.com.
Allow Ads at MrExcel

Which adblocker are you using?

Disable AdBlock

Follow these easy steps to disable AdBlock

1)Click on the icon in the browser’s toolbar.
2)Click on the icon in the browser’s toolbar.
2)Click on the "Pause on this site" option.
Go back

Disable AdBlock Plus

Follow these easy steps to disable AdBlock Plus

1)Click on the icon in the browser’s toolbar.
2)Click on the toggle to disable it for "mrexcel.com".
Go back

Disable uBlock Origin

Follow these easy steps to disable uBlock Origin

1)Click on the icon in the browser’s toolbar.
2)Click on the "Power" button.
3)Click on the "Refresh" button.
Go back

Disable uBlock

Follow these easy steps to disable uBlock

1)Click on the icon in the browser’s toolbar.
2)Click on the "Power" button.
3)Click on the "Refresh" button.
Go back
Back
Top