Salut, surement à adapter pour la plage à copier , les 3 propositions fonctionnent , donc à toi de poursuivre
 
Option Explicit
   Sub CopieFeuilles()
 Dim Ws As Worksheet
 Dim Wkb As Workbook
     Application.ScreenUpdating = False
     Set Wkb = Workbooks.Add
     For Each Ws In ThisWorkbook.Worksheets
         'Ws.UsedRange.Copy Wkb.ActiveSheet.Range("A" & Rows.Count).End(xlUp)(2)
         'Ws.UsedRange.Copy Wkb.ActiveSheet.Range("A" & Rows.Count).End(xlUp).Offset(1)
         Ws.Range("4:" & Ws.Range("A" & Rows.Count).End(xlUp).Row).Copy _
                 Wkb.ActiveSheet.Range("A" & Rows.Count).End(xlUp)(2)
     Next Ws
       Application.DisplayAlerts = False
     ActiveWorkbook.SaveAs Filename:=ThisWorkbook.Path & "\" & "Test Concatenation.xls", FileFormat:=xlNormal
     ActiveWindow.Close
     Application.DisplayAlerts = True
     Application.ScreenUpdating = True
 End Sub  | 
 
Message édité par kiki29 le 16-12-2011 à 23:21:39
 ---------------
			
Myanmar 90/91 : http://gadaud.gerard.free.fr/publi [...] index.html