Opening a Database Secured at the User Level : OLEDB « Access « VBA / Excel / Access / Word






Opening a Database Secured at the User Level

 
Sub Open_WithUserSecurity()
   Dim conn As ADODB.Connection
   Dim strDb As String
   Dim strSysDb As String

   On Error GoTo ErrorHandler
   strDb = CurrentProject.Path & "\mydb.mdb"
   strSysDb = CurrentProject.Path & "\Security.mdw"
   Set conn = New ADODB.Connection
   With conn
      .Provider = "Microsoft.Jet.OLEDB.4.0;"
      .ConnectionString = "Data Source=" & strDb & ";" & _
         "Jet OLEDB:System Database=" & strSysDb
      .Open , "Developer", "WebMaster"
   End With
   conn.Close
   Set conn = Nothing
   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 Password-Protected Database