Hello, I am new to Word VBA and am having trouble with a mail merge code.
Everything works great on the code with the exception of where the files are being saved/exported to.

for this line: Const FOLDER_SAVED As String = "\\DAVINCI-1\USERDATA\carla\Desktop\Test"
No matter what directory I input it always automatically saves to My documents on the C drive.
Any help with this would be greatly appreciated!


Option Explicit
Const FOLDER_SAVED As String = "\\DAVINCI-1\USERDATA\carla\Desktop\Test\"
Const SOURCE_FILE_PATH As String = "\\DAVINCI-1\USERDATA\carla\Desktop\Test\Security Assessment - Positive Result.docx"
Sub TestRun()
Dim MainDoc As Document, TargetDoc As Document
Dim dbPath As String
Dim recordNumber As Long, totalRecord As Long

Set MainDoc = ActiveDocument
With MainDoc.MailMerge            



        
.OpenDataSource Name:="\\DAVINCI-1\USERDATA\carla\Desktop\Test\Internal Controlled Goods Security Assesment.xlsx", sqlstatement:="SELECT * FROM [Letter List$]"
 
 totalRecord = .DataSource.RecordCount
 For recordNumber = 1 To totalRecord
With .DataSource 
.ActiveRecord = recordNumber
.FirstRecord = recordNumber
.LastRecord = recordNumber
End With
.Destination = wdSendToNewDocument
.Execute False
Set TargetDoc = ActiveDocument
TargetDoc.ExportAsFixedFormat OutputFileName:=FOLDER_SAVED & .DataSource.DataFields("First_Name").Value & "_" & .DataSource.DataFields("Last_Name").Value & ".pdf", exportformat:=wdExportFormatPDF                        
TargetDoc.Close False                        
Set TargetDoc = Nothing                            
Next recordNumber
End With
Set MainDoc = Nothing
End Sub