+ Reply to Thread
Results 1 to 7 of 7

*** mask password in inputbox

Hybrid View

  1. #1
    Registered User
    Join Date
    11-14-2014
    Location
    Oslo, Norway
    MS-Off Ver
    2013
    Posts
    3

    *** mask password in inputbox

    Hello!

    I am trying to get this access code to work.
    It's for making **** in the field of an inputbox, so the password cant be seen.

    I's originally a code for a 32 bit system, so the real challenge here is converting it to 64 bit.

    The code are:

    Public sPwd As String
    Public gMsgTitle As String
    Public gMsgType As String
    Public gMsgText As String
    Public gStatusText As String
    
    "FindWindowA" (ByVal lpClassName As String, _
    ByVal lpWindowName As String) As Long
    
    Private Declare PtrSafe Function FindWindowEx Lib "user32" Alias _
    "FindWindowExA" (ByVal hWnd1 As LongPtr, ByVal hWnd2 As LongPtr, _
    ByVal lpsz1 As String, ByVal lpsz2 As String) As LongPtr
    
    Public Declare PtrSafe Function SetTimer& Lib "user32" _
    (ByVal hwnd&, ByVal nIDEvent&, ByVal uElapse&, ByVal _
    lpTimerFunc&)
    
    Public Declare PtrSafe Function KillTimer& Lib "user32" _
    (ByVal hwnd&, ByVal nIDEvent&)
    
    Private Declare PtrSafe Function SendMessage Lib "user32" Alias _
    "SendMessageA" (ByVal hwnd As LongPtr, ByVal wMsg As LongPtr, _
    ByVal wParam As LongPtr, lParam As Any) As LongPtr
    
    Const EM_SETPASSWORDCHAR = &HCC
    Public Const NV_INPUTBOX As Long = &H5000&
    And Function:

    Public Function TimerProc(ByVal lHwnd&, ByVal uMsg&, _
    ByVal lIDEvent&, ByVal lDWTime&) As LongPtr
    
    Dim lTemp As Long
    Dim lEditHwnd As Long
    lTemp = FindWindowEx(FindWindow("#32770", "gMsgText"), 0, "Edit", "")
    lEditHwnd = FindWindowEx(FindWindow("#32770", "gMsgTitle"), 0, "Edit", "")
    
    Call SendMessage(lEditHwnd, EM_SETPASSWORDCHAR, Asc("*"), 0)
    
    KillTimer lHwnd, lIDEvent
    End Function
    Input box:

    Private Sub OpnAdm_Click()
    
    gMsgTitle = "Begrenset Omrde"
    gMsgType = vbOKOnly + vbInformation
    gMsgText = "Tast inn passord"
      
    
    lTemp = SetTimer(Me.hwnd, NV_INPUTBOX, 1, AddressOf TimerProc)
    sPwd = InputBox(gMsgText, gMsgTitle)
    
    
    If strPasswd = "" Or strPasswd = Empty Then
    Exit Sub
    End If
    
    If strPasswd = "yslg53481" Then
    DoCmd.OpenForm "frmBatchReg"
    Else
    MsgBox "Beklager, du har ikke tilgang til denne delen av programmet", vbOKOnly, "Sikkerhetssjekk"
    Exit Sub
    End If
    
    
    End Sub
    Missing anything? The error I get is type missmatch on AddressOf TimerProc. But I know its also needs converting to 64 bit. Don't know how tough.

    I know its 1000 times easier to just make an new form and pwd mask the inputmask, but this is not the case here. I rather have more code and less forms, and it get's on my nerves that I cant find it out, so just need see this through, especially when so many other 32 bit users got it to work

    Anyone know what to do here?

  2. #2
    Forum Expert macropod's Avatar
    Join Date
    12-22-2011
    Location
    Canberra, Australia
    MS-Off Ver
    Word, Excel & Powerpoint 2003 & 2010
    Posts
    3,835

    Re: *** mask password in inputbox

    Cross-posted at:
    http://www.techsupportforum.com/foru...ox-919138.html
    and at:
    http://www.tek-tips.com/viewthread.cfm?qid=1740676
    and at:
    http://windowssecrets.com/forums/sho...rd-in-inputbox

    For cross-posting etiquette, please read FORUM RULE 8: http://www.excelforum.com/forum-rule...rum-rules.html
    Last edited by macropod; 11-16-2014 at 01:34 AM.
    Cheers,
    Paul Edstein
    [Fmr MS MVP - Word]

  3. #3
    Registered User
    Join Date
    11-14-2014
    Location
    Oslo, Norway
    MS-Off Ver
    2013
    Posts
    3

    Re: *** mask password in inputbox

    Oh, sry, did not see that rule :s

    I have posted the issue on several sites, and trust me I am following closly When we figure this out the code goes out on every forum, I do not wish for anyone else to use as much time on tis as I have done

  4. #4
    Forum Contributor
    Join Date
    02-24-2013
    Location
    California
    MS-Off Ver
    Excel 2010
    Posts
    317

    Re: *** mask password in inputbox

    Quote Originally Posted by Kvracing View Post
    Oh, sry, did not see that rule :s

    I have posted the issue on several sites, and trust me I am following closly When we figure this out the code goes out on every forum, I do not wish for anyone else to use as much time on tis as I have done
    Whether you monitor these sites or not, is not the concern. You waste the time of other people who may be trying to help you who don't know you are getting assisitance from another. So it's the OTHER PEOPLE your cross-posting affects.

    If you do cross-post, include all the links of your cross-post in each of your posts fo similar request.
    If I helped in any way, please click the star

  5. #5
    Forum Expert macropod's Avatar
    Join Date
    12-22-2011
    Location
    Canberra, Australia
    MS-Off Ver
    Word, Excel & Powerpoint 2003 & 2010
    Posts
    3,835

    Re: *** mask password in inputbox

    Yet another cross-post found:
    http://www.vbaexpress.com/forum/show...rd-in-inputbox

    Kindly provide links between all forums in which you have cross-posted.

  6. #6
    Valued Forum Contributor
    Join Date
    08-29-2012
    Location
    In lockdown
    MS-Off Ver
    Excel 2010 (2003 to 2016 but 2010 for choice)
    Posts
    1,766

    Re: *** mask password in inputbox

    Quote Originally Posted by Kvracing View Post
    It's for making **** in the field of an inputbox, so the password cant be seen.

    I's originally a code for a 32 bit system, so the real challenge here is converting it to 64 bit.
    Went through my templates and found something you might be interested in. See code below. Be warned that I converted this myself and I don't have 64 bit to test it on so LMK if it doesn't work! HTH

    Attribute VB_Name = "t_AP7_PasswordMask_150113"
    Option Explicit
    Option Private Module
    
    'mc84excel Updated 20130617 - 64 bit compatible
    'mc84excel Updated 20140204 - Error labels
    
    '////////////////////////////////////////////////////////////////////
    'Password masked inputbox
    'Allows you to hide characters entered in a VBA Inputbox.
    '
    'Code written by Daniel Klann
    'http://www.danielklann.com/
    'March 2003
    
    '// Kindly permitted to be amended
    '// Amended by Ivan F Moala
    '// http://www.xcelfiles.com
    '// April 2003
    '// Works for Xl2000+ due the AddressOf Operator
    '////////////////////////////////////////////////////////////////////
    
    'API functions to be used
    #If VBA7 And Win64 Then
        Private Declare PtrSafe Function CallNextHookEx Lib "user32" (ByVal hHook _
            As LongPtr, ByVal ncode As LongLong, ByVal wParam As LongLong, lParam As _
            Any) As LongLong
        Private Declare PtrSafe Function GetModuleHandle Lib "kernel32" Alias _
            "GetModuleHandleA" (ByVal lpModuleName As String) As LongLong
        Private Declare PtrSafe Function SetWindowsHookEx Lib "user32" Alias _
            "SetWindowsHookExA" (ByVal idHook As LongLong, ByVal lpfn As LongPtr, ByVal _
            hmod As LongPtr, ByVal dwThreadId As LongLong) As LongLong
        Private Declare PtrSafe Function UnhookWindowsHookEx Lib "user32" (ByVal _
            hHook As LongPtr) As LongLong
        Private Declare PtrSafe Function SendDlgItemMessage Lib "user32" Alias _
            "SendDlgItemMessageA" (ByVal hDlg As LongPtr, ByVal nIDDlgItem As Long, _
            ByVal wMsg As Long, ByVal wParam As LongPtr, ByVal lParam As LongPtr) As _
            LongPtr
        Private Declare PtrSafe Function GetClassName Lib "user32" Alias _
            "GetClassNameA" (ByVal hwnd As LongPtr, ByVal lpClassName As String, ByVal _
            nMaxCount As LongPtr) As Long
        Private Declare PtrSafe Function GetCurrentThreadId Lib "kernel32" () As _
            LongLong
        Private hHook As LongPtr
    #Else
        Private Declare Function CallNextHookEx Lib "user32" (ByVal hHook As Long, _
            ByVal ncode As Long, ByVal wParam As Long, lParam As Any) As Long
        Private Declare Function GetModuleHandle Lib "kernel32" Alias _
            "GetModuleHandleA" (ByVal lpModuleName As String) As Long
        Private Declare Function SetWindowsHookEx Lib "user32" Alias _
            "SetWindowsHookExA" (ByVal idHook As Long, ByVal lpfn As Long, ByVal hmod _
            As Long, ByVal dwThreadId As Long) As Long
        Private Declare Function UnhookWindowsHookEx Lib "user32" (ByVal hHook As _
            Long) As Long
        Private Declare Function SendDlgItemMessage Lib "user32" Alias _
            "SendDlgItemMessageA" (ByVal hDlg As Long, ByVal nIDDlgItem As Long, ByVal _
            wMsg As Long, ByVal wParam As Long, ByVal lParam As Long) As Long
        Private Declare Function GetClassName Lib "user32" Alias "GetClassNameA" _
            (ByVal hwnd As Long, ByVal lpClassName As String, ByVal nMaxCount As Long) _
            As Long
        Private Declare Function GetCurrentThreadId Lib "kernel32" () As Long
        Private hHook As Long
    #End If
    
    'Constants to be used in our API functions
    Private Const EM_SETPASSWORDCHAR    As Long = &HCC
    Private Const WH_CBT                As Long = 5
    Private Const HCBT_ACTIVATE         As Long = 5
    Private Const HC_ACTION             As Long = 0
    
    
    '// Make it public = avail to ALL Modules
    '// Lets simulate the VBA Input Function
    Public Function InputBoxDK(ByRef Prompt As String, _
                                Optional ByRef Title As String, _
                                Optional ByRef Default As String, _
                                Optional ByRef Xpos As Long, _
                                Optional ByRef Ypos As Long, _
                                Optional ByRef Helpfile As String, _
                                Optional ByRef Context As Long _
                                ) As String
        
        #If VBA7 And Win64 Then
            Dim lngModHwnd      As LongLong
            Dim lngThreadID     As LongLong
        #Else
            Dim lngModHwnd      As Long
            Dim lngThreadID     As Long
        #End If
    
        '// Lets handle any Errors JIC! due to HookProc> App hang!
        On Error GoTo ErrHandler
    
        lngThreadID = GetCurrentThreadId
        lngModHwnd = GetModuleHandle(vbNullString)
    
        hHook = SetWindowsHookEx(WH_CBT, AddressOf NewProc, lngModHwnd, lngThreadID)
    
        If Xpos Then
            InputBoxDK = InputBox(Prompt, Title, Default, Xpos, Ypos, Helpfile, _
                Context)
        Else
            InputBoxDK = InputBox(Prompt, Title, Default, , , Helpfile, Context)
        End If
        
    ExitProcedure:
        UnhookWindowsHookEx hHook
    Exit Function
    ErrHandler:
        Resume ExitProcedure
    End Function
    
    #If VBA7 And Win64 Then
    Private Function NewProc(ByVal lngCode As Long, _
                            ByVal wParam As Long, _
                            ByVal lParam As Long _
                            ) As LongLong
    #Else
    Private Function NewProc(ByVal lngCode As Long, _
                            ByVal wParam As Long, _
                            ByVal lParam As Long _
                            ) As Long
    #End If
    
        Dim RetVal          As Variant
        Dim strClassName    As String
        Dim lngBuffer       As Long
    
        If lngCode < HC_ACTION Then
            NewProc = CallNextHookEx(hHook, lngCode, wParam, lParam)
            Exit Function
        End If
    
        strClassName = String$(256, " ")
        lngBuffer = 255
    
        If lngCode = HCBT_ACTIVATE Then    'A window has been activated
            RetVal = GetClassName(wParam, strClassName, lngBuffer)
            If Left$(strClassName, RetVal) = "#32770" Then  'Class name of the Inputbox
                'This changes the edit control so that it display the password character *.
                'You can change the Asc("*") as you please.
                SendDlgItemMessage wParam, &H1324, EM_SETPASSWORDCHAR, Asc("*"), &H0
            End If
        End If
    
        'This line will ensure that any other hooks that may be in place are
        'called correctly.
        CallNextHookEx hHook, lngCode, wParam, lParam
    End Function
    *******************************************************

    HELP WANTED! (Links to Forum threads)
    Trying to create reusable code for Custom Events at Workbook (not Application) level

    *******************************************************

  7. #7
    Forum Contributor
    Join Date
    08-15-2012
    Location
    Australia
    MS-Off Ver
    Excel 2016
    Posts
    349

    Re: *** mask password in inputbox

    Please click the * Add Reputation if this helps
    If solved remember to mark Thread as solved

    "I'm glad to help and this is not meant to sound smart, but either you have super-human vision to see all those controls cleared one by one with the code I posted, or your computer is really slow."

+ Reply to Thread

Thread Information

Users Browsing this Thread

There are currently 1 users browsing this thread. (0 members and 1 guests)

Similar Threads

  1. Hide/Mask Cell Data Unless Password Entered
    By JimmyG. in forum Excel General
    Replies: 1
    Last Post: 06-28-2014, 04:16 PM
  2. [SOLVED] VBA InputBox Password Validation
    By mcmunoz in forum Excel Programming / VBA / Macros
    Replies: 12
    Last Post: 09-05-2013, 10:25 PM
  3. Asterix when password entered into InputBox
    By adste89 in forum Excel Programming / VBA / Macros
    Replies: 3
    Last Post: 10-29-2012, 10:59 AM
  4. InputBox Password
    By noodle48 in forum Excel Programming / VBA / Macros
    Replies: 2
    Last Post: 07-28-2011, 08:18 AM
  5. How to allow multiple entries from a Password InputBox
    By carsto in forum Excel Programming / VBA / Macros
    Replies: 3
    Last Post: 03-07-2007, 06:41 PM

Bookmarks

Posting Permissions

  • You may not post new threads
  • You may not post replies
  • You may not post attachments
  • You may not edit your posts

Search Engine Friendly URLs by vBSEO 3.6.0 RC 1