Sub SetDbPassword()
Dim conn As ADODB.Connection
Dim strPath As String
On Error GoTo ErrorHandler
strPath = CurrentProject.Path
Set conn = New ADODB.Connection
With conn
.Mode = adModeShareExclusive
.Open "Provider = Microsoft.Jet.OLEDB.4.0;" & _
"Data Source=" & strPath & "\mydb.mdb;"
.Execute "ALTER DATABASE PASSWORD secret null "
End With
ExitHere:
If Not conn Is Nothing Then
If conn.State = adStateOpen Then conn.Close
End If
Set conn = Nothing
Exit Sub
ErrorHandler:
Debug.Print Err.Number & ":" & Err.Description
Resume ExitHere
End Sub
|