Sub DeleteDbPassword()
Dim conn As ADODB.Connection
Dim strPath As String
Dim strPass As String
On Error GoTo ErrorHandler
strPath = CurrentProject.Path
strPass = "secret"
Set conn = New ADODB.Connection
With conn
.Mode = adModeShareExclusive
.Open "Provider = Microsoft.Jet.OleDb.4.0;" & _
"Data Source=" & strPath & "\mydb.mdb;" _
& "Jet OLEDB:Database Password = " & strPass
.Execute "ALTER DATABASE PASSWORD null secret"
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
|