[EDIT]
Summarizing the discussion based on bigazonk's comments...
There is probably
not possible to send email as another person. Why? See this:
Send an e-mail message on behalf of someone else[
^]
The only way is to forward a mail message. ;(
Example macro for "original forwarding", assuming that person has a permission to send mail on behalf of someone else, should looks like:
Option Explicit
Sub PushMailToMe()
Dim srcMi As MailItem, dstMi As MailItem
Dim fld As Folder, att As Attachment
On Error GoTo Err_PushMailToMe
Set fld = Application.Session.GetDefaultFolder(olFolderInbox)
For Each srcMi In fld.Items
If srcMi.UnRead = False Then GoTo SkipMail
Set dstMi = Application.CreateItem(olMailItem)
With dstMi
.Sender = srcMi.Sender
.Subject = srcMi.Subject
.To = "mymail@domain.com"
.CC = srcMi.CC
.BodyFormat = olFormatHTML
.HTMLBody = srcMi.HTMLBody & vbCrLf & vbCrLf & "Original forwarding by PushMailToMe (year: 2013)"
For Each att In srcMi.Attachments
.Attachments.Add att
Next
.Send
End With
SkipMail:
Next
Exit_PushMailToMe:
On Error Resume Next
Set srcMi = Nothing
Set dstMi = Nothing
Exit Sub
Err_PushMailToMe:
MsgBox Err.Description, vbExclamation, Err.Number
Resume Exit_PushMailToMe
End Sub
Cheers!
Maciej Los
[/EDIT]