Hi Leo,
Try this code.
Code:
Option Explicit
Sub kTest()
Dim cboDDowns() As DropDown
Dim i As Long
Dim c As Long
Dim wksSource As Worksheet
Dim wksDest As Worksheet
With Worksheets("Model Selection")
c = .DropDowns.Count
If c Then
ReDim cboDDowns(1 To c)
For i = 1 To c
Set cboDDowns(i) = .DropDowns(i)
Next
End If
End With
For i = 1 To c
Set wksSource = Worksheets(cboDDowns(i).List(cboDDowns(i).ListIndex))
Set wksDest = Worksheets("Data" & i)
wksDest.Range("a6:u" & wksDest.UsedRange.Rows.Count).ClearContents
With wksSource
.Range("a5:u" & .Range("a" & .Rows.Count).End(xlUp).Row).Copy wksDest.Range("a6")
End With
Next
End Sub
Bookmarks