Link to home
Start Free TrialLog in
Avatar of CFMI
CFMIFlag for United States of America

asked on

MS Access VBA to copy Workbook Worksheet to another Workbook

Hello Experts,

Please provide assistance to include a MS Access table field that displays the Path and the File Name along with the Tab name as I am receiving a Run Time Error 1004 that displays " Output 1.xlsx could not be found".  I first tried the Spreadsheet Name then entered the Spreadsheet Tab inside the boded below statement – this is where the code stops. The Access table looks like:
ID      SpreadsheetName                                                                            SpreadsheetTab
1      X:\2013 reports\cfi consol nod 0313.xlsm                                       Output 1
2      X:\2013 reports\cfmi consol 0313.xlsm                                           Output 1
3      X:\Reports Close\CFMI Pre_Close_w_filters_RiskNEW.xlsm        Output 1 (100.100.T05)

and the VBA:
Private Sub WorksheetsCopy_Click()
Dim CopyFrom As Object
Dim CopyTo As Object
Dim CopyThis As Object
Dim xl As Object
Dim SpreadsheetName As String
Dim SpreadsheetTab As String
Dim ID As Field
Dim rs As Recordset
Dim sh As Worksheet
Dim oldPath As String, newPath As String
''Late binding
Set xl = CreateObject("Excel.Application")
xl.Visible = True
newPath = "H:\PDF"
Set rs = CurrentDb.OpenRecordset("TblReports")
Do While Not (rs.EOF)
Dim wkbSource As Excel.workbook
Dim wkbDest As Excel.workbook
Set wkbSource = Workbooks.Open(xl.Workbooks.Open(rs("SpreadsheetTab")))
Set wkbDest = Workbooks.Open("H:\PDF\MasterReport.xlsx")
    'Opens workbook
   Workbooks.Open "wkbSource"
   'Makes a copy of "Sheet1"
    ActiveWorkbook.Sheets("Sheet1").Copy _
       after:=ActiveWorkbook.Sheets("Sheet1")
       'Copies that copy to "wkbDest" workbook
        ActiveSheet.Move Before:=Workbooks("wkbDest").Sheets(1)
        ActiveSheet.Next.Select
       'Closes "wkbDest" workbook and saves the copied sheeet
       ActiveWorkbook.Close SaveChanges:=True
  rs.MoveNext
CopyFrom.Close False
Loop
rs.Close
End Sub

Thanks,
Bob
Avatar of Patrick Matthews
Patrick Matthews
Flag of United States of America image

Always, always, always qualify your references to external objects.



Private Sub WorksheetsCopy_Click()
Dim CopyFrom As Object
Dim CopyTo As Object
Dim CopyThis As Object
Dim xl As Object
Dim SpreadsheetName As String
Dim SpreadsheetTab As String
Dim ID As Field
Dim rs As Recordset
Dim sh As Worksheet
Dim oldPath As String, newPath As String
Dim wkbSource As Excel.workbook
Dim wkbDest As Excel.workbook
''Late binding
Set xl = CreateObject("Excel.Application")
xl.Visible = True
newPath = "H:\PDF"
Set rs = CurrentDb.OpenRecordset("TblReports")
Set wkbSource = xl.Workbooks.Open(xl.Workbooks.Open(rs("SpreadsheetTab")))
Do While Not (rs.EOF)
Set wkbDest = xl.Workbooks.Open("H:\PDF\MasterReport.xlsx")
   'Makes a copy of "Sheet1"
    wkbSource.Sheets("Sheet1").Copy _
       Before:=wkbDest.Sheets(1)
       'Closes "wkbDest" workbook and saves the copied sheeet
       wkbDest.Close SaveChanges:=True
  rs.MoveNext
Loop
wkbSource.Close False
rs.Close
Set wkbSource = Nothing
Set wkbDest = Nothing
xl.Quit
Set xl = Nothing
End Sub

Open in new window

Avatar of CFMI

ASKER

Using the above code received the same error message, "Run Time Error 1004 as Output 1.xlsx could not be found" - this points to Line #19; please help.
Private Sub WorksheetsCopy_Click()

    Dim xl As Object
    Dim rs As DAO.Recordset
    Dim wkbSource As Excel.workbook
    Dim wkbDest As Excel.workbook

    ''Late binding
    Set xl = CreateObject("Excel.Application")
    xl.Visible = True
    newPath = "H:\PDF"
    Set rs = CurrentDb.OpenRecordset("TblReports")
    Set wkbDest = xl.Workbooks.Open("H:\PDF\MasterReport.xlsx")

    Do While Not (rs.EOF)
        Set wkbSource = xl.Workbooks.Open(rs("SpreadsheetName"))
        'Makes a copy of "Sheet1"
        wkbSource.Worksheets(rs("SpreadsheetName")).Copy _
            Before:=wkbDest.Sheets(1)
        wkbSource.Close False
        rs.MoveNext
    Loop

    'Closes "wkbDest" workbook and saves the copied sheeet
    wkbDest.Close SaveChanges:=True

    rs.Close
    Set wkbSource = Nothing
    Set wkbDest = Nothing
    xl.Quit
    Set xl = Nothing

End Sub
Avatar of CFMI

ASKER

The above code receives a "Type Mismatched" error message and points to:
    wkbSource.Worksheets(rs("SpreadsheetName")).Copy _
        Before:=wkbDest.Sheets(1)

My guess is the Worsheet name is "Output 1" and it expects "Sheet 1".  The destination is to a Workbook with a worksheet named, "Sheet 1".
Sorry, that should be:

        wkbSource.Worksheets(rs("SpreadsheetTab")).Copy _
            Before:=wkbDest.Sheets(1)

Now, that places the copied worksheet before the first sheet overall.  To place it before "Sheet 1"...

        wkbSource.Worksheets(rs("SpreadsheetTab")).Copy _
            Before:=wkbDest.Sheets("Sheet 1")
Avatar of CFMI

ASKER

We now have anther error message stating, "Subscript out of range" using:
    wkbSource.Worksheets(rs("SpreadsheetTab")).Copy _
            Before:=wkbDest.Sheets("Sheet 1")
ASKER CERTIFIED SOLUTION
Avatar of Patrick Matthews
Patrick Matthews
Flag of United States of America image

Link to home
membership
This solution is only available to members.
To access this solution, you must be a member of Experts Exchange.
Start Free Trial
Avatar of CFMI

ASKER

Both workbooks open, then I see the error message and the workbooks remain opened and are the correct workbooks but nothing is copied.  The error message states, "Subscript out of range" and debugging points to:
    wkbSource.Worksheets(rs("SpreadsheetTab")).Copy _
        Before:=wkbDest.Sheets("Sheet 1")")

Then I changed it to: Before:=wkbDest.Sheets("Sheet1")")  and I received Type mismatch.


Overall, I am reading in 53 specific Workbook, worksheets and coping them to a Master Workbook with 53 worksheets; perhaps I do not already need a spreadsheet with 53 worksheets especially since it doesn’t even seem to be copying?

Current code:
Private Sub TestCopy_Click()
Dim CopyFrom As Object
Dim CopyTo As Object
Dim CopyThis As Object
Dim xl As Object
Dim SpreadsheetName As String
Dim SpreadsheetTab As String
Dim ID As Field
Dim rs As Recordset
Dim sh As Worksheet
Dim oldPath As String, newPath As String
Dim wkbSource As Excel.Workbook
Dim wkbDest As Excel.Workbook
    ''Late binding
Set xl = CreateObject("Excel.Application")
xl.Visible = True
newPath = "H:\PDF"
Set rs = CurrentDb.OpenRecordset("TblReports")
'Set wkbSource = xl.Workbooks.Open(xl.Workbooks.Open(rs("SpreadsheetTab")))
Set wkbSource = xl.Workbooks.Open(rs("SpreadsheetName"))
Set wkbDest = xl.Workbooks.Open("H:\PDF\MasterReport.xlsx")
Do While Not (rs.EOF)
    Set wkbSource = xl.Workbooks.Open(rs("SpreadsheetName"))
    Set wkbDest = xl.Workbooks.Open("H:\PDF\MasterReport.xlsx")
        'Makes a copy of "Sheet1"
   wkbSource.Worksheets(rs("SpreadsheetTab")).Copy _
            Before:=wkbDest.Sheets("Sheet 1")    
       'Closes "wkbDest" workbook and saves the copied sheeet
    wkbSource.Close False
  rs.MoveNext
Loop
    'Closes "wkbDest" workbook and saves the copied sheet
wkbDest.Close SaveChanges:=True
wkbSource.Close False
rs.Close
Set wkbSource = Nothing
Set wkbDest = Nothing
xl.Quit
Set xl = Nothing

End Sub
MasterReport.xlsx
Avatar of CFMI

ASKER

The code worked well but I was provided an incorrect worksheet title and this creates an out of sequence error so my learning, verify all input FIRST - Thanks!