0% found this document useful (0 votes)
53 views

Password Recovery Tool For VBA in Excel

The document contains a VBA code subroutine that attempts to crack a password by generating all possible combinations of characters between ASCII codes 65 and 66 for letters and 32 to 126 for symbols and checking each one to see if it successfully unprotects a worksheet. If a combination is found that works, it displays the password in a message box and writes it to cell A1. It uses nested For loops to iterate through all possible character combinations up to a length of 12 characters long.

Uploaded by

Pandit Sumit
Copyright
© © All Rights Reserved
Available Formats
Download as TXT, PDF, TXT or read online on Scribd
0% found this document useful (0 votes)
53 views

Password Recovery Tool For VBA in Excel

The document contains a VBA code subroutine that attempts to crack a password by generating all possible combinations of characters between ASCII codes 65 and 66 for letters and 32 to 126 for symbols and checking each one to see if it successfully unprotects a worksheet. If a combination is found that works, it displays the password in a message box and writes it to cell A1. It uses nested For loops to iterate through all possible character combinations up to a length of 12 characters long.

Uploaded by

Pandit Sumit
Copyright
© © All Rights Reserved
Available Formats
Download as TXT, PDF, TXT or read online on Scribd
You are on page 1/ 1

Sub PasswordBreaker()

Dim i As Integer, j As Integer, k As Integer


Dim l As Integer, m As Integer, n As Integer
Dim i1 As Integer, i2 As Integer, i3 As Integer
Dim i4 As Integer, i5 As Integer, i6 As Integer
On Error Resume Next
For i = 65 To 66: For j = 65 To 66: For k = 65 To 66
For l = 65 To 66: For m = 65 To 66: For i1 = 65 To 66
For i2 = 65 To 66: For i3 = 65 To 66: For i4 = 65 To 66
For i5 = 65 To 66: For i6 = 65 To 66: For n = 32 To 126
ActiveSheet.Unprotect Chr(i) & Chr(j) & Chr(k) & _
Chr(l) & Chr(m) & Chr(i1) & Chr(i2) & Chr (i3) & _
Chr(i4) & Chr(i5) & Chr(i6) & Chr(n)
If ActiveSheet.ProtectContents = False Then
MsgBox "One usable password is " & Chr (i) & Chr(j) & _
Chr(k) & Chr(l) & Chr(m) & Chr(i1) & Chr (i2)
& _
Chr(i3) & Chr(i4) & Chr(i5) & Chr(i6) & Chr(n)
ActiveWorkbook.Sheets(1).Select
Range("a1").FormulaR1C1 = Chr(i) & Chr(j) & _
Chr(k) & Chr(l) & Chr(m) & Chr(i1) & Chr (i2) & _
Chr(i3) & Chr(i4) & Chr(i5) & Chr(i6) & Chr(n)
Exit Sub
End If
Next: Next: Next: Next: Next: Next
Next: Next: Next: Next: Next: Next
End Sub

You might also like