SharingItem object (Outlook)
Represents a sharing message in an Inbox folder.
Remarks
Use the CreateSharingItem method of the NameSpace object to create a SharingItem object that represents a new sharing request or sharing invitation.
Use Item (index), where index is the index number of a sharing message or a value used to match the default property of a message, to return a single SharingItem object from an Inbox folder.
Example
The following Visual Basic for Applications (VBA) example creates and displays a new sharing invitation for the Tasks folder.
Public Sub CreateTasksSharingItem()
On Error GoTo ErrRoutine
Dim mapiNamespace As Outlook.NameSpace
Set mapiNamespace = Outlook.Application.GetNamespace("MAPI")
Dim tasksFolder As Outlook.Folder
Set tasksFolder = mapiNamespace.GetDefaultFolder(Outlook.olFolderTasks)
Dim invitation As Outlook.SharingItem
Set invitation = appNamespace.CreateSharingItem(tasksFolder)
invitation.Display
EndRoutine:
Exit Sub
ErrRoutine:
MsgBox Err.Description, vbOKOnly, Err.Number & " - " & Err.Source
Resume EndRoutine
End Sub
Events
- AfterWrite
- AttachmentAdd
- AttachmentRead
- AttachmentRemove
- BeforeAttachmentAdd
- BeforeAttachmentPreview
- BeforeAttachmentRead
- BeforeAttachmentSave
- BeforeAttachmentWriteToTempFile
- BeforeAutoSave
- BeforeCheckNames
- BeforeDelete
- BeforeRead
- Close
- CustomAction
- CustomPropertyChange
- Forward
- Open
- PropertyChange
- Read
- ReadComplete
- Reply
- ReplyAll
- Send
- Unload
- Write
Methods
- AddBusinessCard
- Allow
- ClearConversationIndex
- ClearTaskFlag
- Close
- Copy
- Delete
- Deny
- Display
- Forward
- GetConversation
- MarkAsTask
- Move
- OpenSharedFolder
- PrintOut
- Reply
- ReplyAll
- Save
- SaveAs
- Send
- ShowCategoriesDialog
Properties
- Actions
- AllowWriteAccess
- AlternateRecipientAllowed
- Application
- Attachments
- AutoForwarded
- BCC
- BillingInformation
- Body
- BodyFormat
- Categories
- CC
- Class
- Companies
- Conflicts
- ConversationID
- ConversationIndex
- ConversationTopic
- CreationTime
- DeferredDeliveryTime
- DeleteAfterSubmit
- DownloadState
- EntryID
- ExpiryTime
- FlagRequest
- FormDescription
- GetInspector
- HTMLBody
- Importance
- InternetCodepage
- IsConflict
- IsMarkedAsTask
- ItemProperties
- LastModificationTime
- MarkForDownload
- MessageClass
- Mileage
- NoAging
- OriginatorDeliveryReportRequested
- OutlookInternalVersion
- OutlookVersion
- Parent
- Permission
- PermissionService
- PermissionTemplateGuid
- PropertyAccessor
- ReadReceiptRequested
- ReceivedByEntryID
- ReceivedByName
- ReceivedOnBehalfOfEntryID
- ReceivedOnBehalfOfName
- ReceivedTime
- RecipientReassignmentProhibited
- Recipients
- ReminderOverrideDefault
- ReminderPlaySound
- ReminderSet
- ReminderSoundFile
- ReminderTime
- RemoteID
- RemoteName
- RemotePath
- RemoteStatus
- ReplyRecipientNames
- ReplyRecipients
- RequestedFolder
- RetentionExpirationDate
- RetentionPolicyName
- RTFBody
- Saved
- SaveSentMessageFolder
- SenderEmailAddress
- SenderEmailType
- SenderName
- SendUsingAccount
- Sensitivity
- Sent
- SentOn
- SentOnBehalfOfName
- Session
- SharingProvider
- SharingProviderGuid
- Size
- Subject
- Submitted
- TaskCompletedDate
- TaskDueDate
- TaskStartDate
- TaskSubject
- To
- ToDoTaskOrdinal
- Type
- UnRead
- UserProperties
See also
Support and feedback
Have questions or feedback about Office VBA or this documentation? Please see Office VBA support and feedback for guidance about the ways you can receive support and provide feedback.