Opening a Password-Protected Database : OLEDB « Access « VBA / Excel / Access / Word






Opening a Password-Protected Database

 
Sub Open_WithDbPassword()
   Dim conn As ADODB.Connection
   Dim strDb As String
   On Error GoTo ErrorHandler
   strDb = CurrentProject.Path & "\mydb.mdb"
   Set conn = New ADODB.Connection
   With conn
      .Provider = "Microsoft.Jet.OLEDB.4.0;"
      .ConnectionString = "Data Source=" & strDb & ";" & _
           "Jet OLEDB:Database Password=secret;"
      .Open
   End With
   Debug.Print "Password protected database was opened."
   conn.Close
   Set conn = Nothing
   Debug.Print "Database was closed."
   Exit Sub
ErrorHandler:
   MsgBox Err.Number & ": " & Err.Description
End Sub

 








Related examples in the same category

1.Use OLEDB to connect with mdb file
2.Opening a Database in Read/Write Mode
3.Opening a Database in Read-Only Mode
4.Opening a Database Secured at the User Level