I'm using the following code to export attachments to a folder on my disk. I would like to modify the code to prompt the user for the save folder.
Private Sub Export_Attachment_Click()
On Error GoTo Err_SaveImage
Dim db As DAO.Database
Dim rsParent As DAO.Recordset2
Dim rsChild As DAO.Recordset2
Set db = CurrentDb
Set rsParent = db.OpenRecordset("select * from tbl_MOU")
Do Until rsParent.EOF
Set rsChild = rsParent.Fields("Open ISA_MOU").Value
rsChild.OpenRecordset
If rsChild.RecordCount <> 0 Then
rsChild.Fields("FileData").SaveToFile ("\\cdc.gov\private\L327\xbn8\Attachments\")
End If
rsChild.Close
Set rsChild = Nothing
rsParent.MoveNext
Loop
Exit_SaveImage:
Set rsChild = Nothing
Set rsParent = Nothing
Exit Sub
Err_SaveImage:
If Err = 3839 Then
MsgBox ("File Already Exists in the Directory!")
Resume Next
Else
MsgBox "Some Other Error occured!", Err.Number, Err.Description
Resume Exit_SaveImage
End If
End Sub
You could use
Open in new window
Regards