So I have two sets of script that I am trying to get to work together. The select and copy script needs to remain as is because it only selects cells that display a value and this varies depending on how many employees there are in that range etc... The copy portion of what I am trying to do works fine. But I can't get it to paste into an email that generates with the second one that is "called" at the end of the copy script. The second one opens and email and puts some generic verbiage in it but I can't get the selection that was copied to paste in the body. However I can click in the email that is generated and "ctrl + v" and the selection will paste in there fine.

Any ideas?

Copy Script:

Sub a()
Dim LR As Long, cell As Range, rng As Range
With Sheets("Manpower Output")
LR = .Range("G" & Rows.Count).End(xlUp).Row
For Each cell In .Range("A1:G500" & LR)
If cell.Value <> "" Then
If rng Is Nothing Then
Set rng = cell
Else
Set rng = Union(rng, cell)
End If
End If
Next cell
rng.Select
End With
Selection.Copy
Call EmailWithOutlook
End Sub
Open Email Script:

Sub EmailWithOutlook()
'Variable declaration
Dim oApp As Object, oMail As Object, Pth As String
'Create and show the outlook mail item
Set oApp = CreateObject("Outlook.Application")
Set oMail = oApp.CreateItem(0)
With oMail
'Uncomment the line below to hard code a recipient
'.To = ""
'Uncomment the line below to hard code a subject
.Subject = "Subject Here"
.Body = "All," & vbNewLine & _
vbNewLine & _
"Please see attached" & vbNewLine & _
vbNewLine & _
"Thanks,"
.Display
End With
'Restore screen updating and release Outlook
Application.ScreenUpdating = True
Set oMail = Nothing
Set oApp = Nothing
End Sub