0% found this document useful (0 votes)
5 views1 page

VBA Exercise

Uploaded by

chandrasekar
Copyright
© © All Rights Reserved
We take content rights seriously. If you suspect this is your content, claim it here.
Available Formats
Download as TXT, PDF, TXT or read online on Scribd
0% found this document useful (0 votes)
5 views1 page

VBA Exercise

Uploaded by

chandrasekar
Copyright
© © All Rights Reserved
We take content rights seriously. If you suspect this is your content, claim it here.
Available Formats
Download as TXT, PDF, TXT or read online on Scribd
You are on page 1/ 1

Sub try()

Dim i As Integer
Dim a(10) As Variant
i = 3
j = 2
'Sheet3.Range("O6").Value = Sheet1.Range("B3").Value

'Sheet1.Range("B3").Copy
'Sheet3.Range("O6").PasteSpecial xlPasteValues

'a(1) = Sheet1.Range("B3").Value
'Sheet3.Range("O6").Value = a(1)
Save_Location = InputBox("Specify the Save location for the SIS sheets:" & vbCrLf &
"(Right click the folder where the files have to be saved and choose copy as path,
paste the location here)")
Do While Sheet1.Range("A" & i).Value <> ""

Do While Sheet1.Cells(2, j).Value <> ""


Sheet1.Activate
a(1) = Cells(2, j).Value
a(2) = Cells(i, j).Value
Sheet3.Range(a(1)).Value = a(2)
j = j + 1
Loop
Sheet3.Activate
ActiveSheet.ExportAsFixedFormat Type:=xlTypePDF, Filename:="C:\Users\SIP010512\
Desktop\Rough\" & i
i = i + 1
Loop
End Sub

You might also like