Jaafar Tribak

Well-known Member
Joined
Dec 5, 2002
Messages
9,604
Office Version
  1. 2016
Platform
  1. Windows
Hi, this an continuation of some code I posted in the past see Here ... This new addition uses file monikers to register objects in the Running Object Table and hence makes it possible to access UserForms from remote processes via the standard GetObject vba function.

The advantage of using this method over the one showed in the other thread is that it can be applied to multiple userforms at once.

You can reference the remote UserForm via its Name Property or its Caption - You decide by setting the Optional Boolean CallByCaption parameter in the PutInROT SUB.

Here is an example of how to reference a remote userform :
Set oRemoteUserForm = GetObject("MonikerTest.UserForm1")

MonikerTest
[name of the workbook (Without the file extension) that contains the userForm] + "." + UserForm1 [ name or caption of the UserForm].


File Demo:
MonikerTest.xls



1- Main API code in a Standard Module:
VBA Code:
Option Explicit

#If VBA7 Then
    #If Win64 Then
        Private Declare PtrSafe Function GetWindowLong Lib "user32" Alias "GetWindowLongPtrA" (ByVal hwnd As LongPtr, ByVal nIndex As Long) As LongPtr
        Private Declare PtrSafe Function SetWindowLong Lib "user32" Alias "SetWindowLongPtrA" (ByVal hwnd As LongPtr, ByVal nIndex As Long, ByVal dwNewLong As LongPtr) As LongPtr
    #Else
        Private Declare PtrSafe Function GetWindowLong Lib "user32" Alias "GetWindowLongA" (ByVal hwnd As LongPtr, ByVal nIndex As Long) As LongPtr
        Private Declare PtrSafe Function SetWindowLong Lib "user32" Alias "SetWindowLongA" (ByVal hwnd As LongPtr, ByVal nIndex As Long, ByVal dwNewLong As LongPtr) As LongPtr
    #End If
    Private Declare PtrSafe Function GetRunningObjectTable Lib "ole32" (ByVal dwReserved As Long, pResult As LongPtr) As Long
    Private Declare PtrSafe Function CreateFileMoniker Lib "ole32" (ByVal lpszPathName As LongPtr, pResult As LongPtr) As Long
    Private Declare PtrSafe Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As LongPtr)
    Private Declare PtrSafe Function DispCallFunc Lib "oleAut32.dll" (ByVal pvInstance As LongPtr, ByVal offsetinVft As LongPtr, ByVal CallConv As Long, ByVal retTYP As Integer, ByVal paCNT As Long, ByRef paTypes As Integer, ByRef paValues As LongPtr, ByRef retVAR As Variant) As Long
    Private Declare PtrSafe Sub SetLastError Lib "kernel32.dll" (ByVal dwErrCode As Long)
    Private Declare PtrSafe Function IUnknown_GetWindow Lib "shlwapi" Alias "#172" (ByVal pIUnk As IUnknown, ByVal hwnd As LongPtr) As Long
    Private Declare PtrSafe Sub PathRemoveExtension Lib "shlwapi.dll" Alias "PathRemoveExtensionA" (ByVal pszPath As String)
#Else
    Private Declare Function GetWindowLong Lib "user32" Alias "GetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long) As Long
    Private Declare Function SetWindowLong Lib "user32" Alias "SetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long, ByVal dwNewLong As Long) As Long
    Private Declare Function GetRunningObjectTable Lib "ole32" (ByVal dwReserved As Long, pResult As Long) As Long
    Private Declare Function CreateFileMoniker Lib "ole32" (ByVal lpszPathName As Long, pResult As Long) As Long
    Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As Long)
    Private Declare Function DispCallFunc Lib "oleAut32.dll" (ByVal pvInstance As Long, ByVal offsetinVft As Long, ByVal CallConv As Long, ByVal retTYP As Integer, ByVal paCNT As Long, ByRef paTypes As Integer, ByRef paValues As Long, ByRef retVAR As Variant) As Long
    Private Declare Sub SetLastError Lib "kernel32.dll" (ByVal dwErrCode As Long)
    Private Declare Function IUnknown_GetWindow Lib "shlwapi" Alias "#172" (ByVal pIUnk As IUnknown, ByVal hwnd As Long) As Long
    Private Declare Sub PathRemoveExtension Lib "shlwapi.dll" Alias "PathRemoveExtensionA" (ByVal pszPath As String)
 #End If
 
 
 
Public Sub PutInROT(ByVal UForm As Object, Optional ByVal CallByCaption As Boolean)

    Const GWLP_USERDATA = &HFFFFFFEB
    
    #If Win64 Then
        Dim hwnd As LongLong
    #Else
        Dim hwnd As Long
    #End If

    Dim lCookie As Long
    Dim sWBookName As String, sNameOrCaption As String

    sWBookName = ThisWorkbook.Name
    Call PathRemoveExtension(sWBookName)
    If InStr(sWBookName, vbNullChar) Then
        sWBookName = Left(sWBookName, InStr(sWBookName, vbNullChar) - 1)
    End If
    
    If CallByCaption And Len(UForm.Caption) Then
        sNameOrCaption = UForm.Caption
    Else
        sNameOrCaption = UForm.Name
    End If

    lCookie = RegisterObjectInROT(UForm, sWBookName & "." & sNameOrCaption)
    
    If lCookie Then
        Call IUnknown_GetWindow(UForm, VarPtr(hwnd))
        Call SetWindowLong(hwnd, GWLP_USERDATA, lCookie)
    End If
    
End Sub


Public Sub RemoveFromROT(ByVal UForm As Object)

    Const GWLP_USERDATA = &HFFFFFFEB
    
    #If Win64 Then
        Dim hwnd As LongLong
    #Else
        Dim hwnd As Long
    #End If
    
    Dim lCookie As Long

    Call IUnknown_GetWindow(UForm, VarPtr(hwnd))
    lCookie = CLng(GetWindowLong(hwnd, GWLP_USERDATA))
    If lCookie Then Call RevokeObject(lCookie)

End Sub

 
 
 '___________________________________SUPPORTING ROUTINES________________________________
 
Private Function RegisterObjectInROT(Obj As Object, sPathName As String) As Long

    Const ROTFLAGS_REGISTRATIONKEEPSALIVE = 1
    Const REGISTER_VTBL_OFFSET  As Long = 3
    Const CC_STDCALL = 4
    Const S_OK = 0

    #If Win64 Then
        Const PTR_LEN = 8
        Dim pROT As LongLong
        Dim pMoniker As LongLong
    #Else
        Const PTR_LEN = 4
        Dim pROT As Long
        Dim pMoniker As Long
    #End If

    If GetRunningObjectTable(0, pROT) <> S_OK Then
        MsgBox "GetRunningObjectTable failed !": Exit Function
    End If
    If CreateFileMoniker(StrPtr(sPathName), pMoniker) <> S_OK Then
           MsgBox "CreateFileMoniker failed !": Exit Function
    End If
    
    vtblCall pROT, REGISTER_VTBL_OFFSET * PTR_LEN, vbLong, _
    CC_STDCALL, ROTFLAGS_REGISTRATIONKEEPSALIVE, Obj, pMoniker, VarPtr(RegisterObjectInROT)

End Function
 
Private Sub RevokeObject(ByVal lCookie As Long)

    Const REVOKE_VTBL_OFFSET = 4
    Const CC_STDCALL = 4
    Const S_OK = 0

    #If Win64 Then
        Const PTR_LEN = 8
        Dim pROT As LongLong
    #Else
        Const PTR_LEN = 4
        Dim pROT As Long
    #End If
    
    If GetRunningObjectTable(0, pROT) <> S_OK Then
        MsgBox "GetRunningObjectTable failed !": Exit Sub
    End If
    
    vtblCall pROT, REVOKE_VTBL_OFFSET * PTR_LEN, vbLong, CC_STDCALL, lCookie

End Sub



#If Win64 Then
    Private Function vtblCall(ByVal InterfacePointer As LongLong, ByVal VTableOffset As Long, ByVal FunctionReturnType As Long, ByVal CallConvention As Long, ParamArray FunctionParameters() As Variant) As Variant
    Dim vParamPtr() As LongLong
#Else
    Private Function vtblCall(ByVal InterfacePointer As Long, ByVal VTableOffset As Long, ByVal FunctionReturnType As Long, ByVal CallConvention As Long, ParamArray FunctionParameters() As Variant) As Variant
    Dim vParamPtr() As Long
#End If

    If InterfacePointer = 0& Or VTableOffset < 0& Then Exit Function
    If Not (FunctionReturnType And &HFFFF0000) = 0& Then Exit Function

    Dim pIndex As Long, pCount As Long
    Dim vParamType() As Integer
    Dim vRtn As Variant, vParams() As Variant

    vParams() = FunctionParameters()
    pCount = Abs(UBound(vParams) - LBound(vParams) + 1&)
    If pCount = 0& Then
        ReDim vParamPtr(0 To 0)
        ReDim vParamType(0 To 0)
    Else
        ReDim vParamPtr(0 To pCount - 1&)
        ReDim vParamType(0 To pCount - 1&)
        For pIndex = 0& To pCount - 1&
            vParamPtr(pIndex) = VarPtr(vParams(pIndex))
            vParamType(pIndex) = VarType(vParams(pIndex))
        Next
    End If

    pIndex = DispCallFunc(InterfacePointer, VTableOffset, CallConvention, FunctionReturnType, pCount, _
    vParamType(0), vParamPtr(0), vRtn)
    If pIndex = 0& Then
        vtblCall = vRtn
    Else
        SetLastError pIndex
    End If

End Function

2- Code in the UserForm(s) Module:
VBA Code:
Option Explicit

Private Sub UserForm_Initialize()
    Call PutInROT(Me)
End Sub

Private Sub UserForm_QueryClose(Cancel As Integer, CloseMode As Integer)
    Call RemoveFromROT(Me)
End Sub


3- Code Usage example as per file demo ( Meant to be ran from a seperate workbook vbproject or from a second excel instance)
VBA Code:
Option Explicit

Sub Macro()

    Dim oRemoteUserForm  As Object
    
    Set oRemoteUserForm = GetObject("MonikerTest.UserForm1")
    With oRemoteUserForm
        .TextBox1.Visible = False
        .Label1.Caption = "Great !!" & vbCrLf & "You successfully referenced " & _
         oRemoteUserForm.Name & " from a second xl instance and changed its color."
        .BackColor = vbYellow
       End With
    
    Set oRemoteUserForm = GetObject("MonikerTest.UserForm2")
    With oRemoteUserForm
        .TextBox1.Visible = False
        .Label1.Caption = "Great !!" & vbCrLf & "You successfully referenced " & _
        oRemoteUserForm.Name & " from a second xl instance and changed its color."
        .BackColor = vbCyan
    End With

End Sub


As you no doubt know, referencing a remote userform is usually done by setting a reference to the remote vbproject and\or by priorly setting a routine in the target workbook that returns a pointer to the userform (RUN Method) but the approach I use here is, in my humble opinion, more flexible (It can even allow you to sink events remotely using WithEvents) .. Most importantly, coding this was a good learning exercise and fun to do.
 

Excel Facts

Difference between two dates
Secret function! Use =DATEDIF(A2,B2,"Y")&" years"&=DATEDIF(A2,B2,"YM")&" months"&=DATEDIF(A2,B2,"MD")&" days"
Thank you for this. Your posts/workbooks are always valuable learninig opportunities and the topics almost always seem to be in answer to the question I ask myself: "I wonder how you do ....", and there it is! Thank you.
 
Upvote 0
Thank you for this. Your posts/workbooks are always valuable learninig opportunities and the topics almost always seem to be in answer to the question I ask myself: "I wonder how you do ....", and there it is! Thank you.
Thanks for your feedback Dan_W

... and Yes, the willingness and possibility to always learn something new is what keeps me interested :)
 
Upvote 0

Forum statistics

Threads
1,214,830
Messages
6,121,835
Members
449,051
Latest member
excelquestion515

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