ContactItem.FullName property (Outlook)

Returns or sets a String specifying the whole, unparsed full name for the contact. Read/write.

Syntax

expression.FullName

expression A variable that represents a ContactItem object.

Remarks

This property is parsed into the FirstName, MiddleName, LastName, and Suffix properties, which may be changed or typed independently if they are parsed incorrectly. Any changes or entries to the FirstName, LastName, MiddleName, or Suffix properties will be overwritten by any subsequent changes or entries to FullName.

Example

This Visual Basic for Applications (VBA) example uses the Restrict method to apply a filter to the contact items based on the item's LastModificationTime property, and then it displays the full name of the contacts returned by the filter.

Public Sub ContactDateCheck() 
 
 Dim myNamespace As Outlook.NameSpace 
 
 Dim myContacts As Outlook.Items 
 
 Dim myItems As Outlook.Items 
 
 Dim myItem As Object 
 
 
 
 Set myNamespace = Application.GetNamespace("MAPI") 
 
 Set myContacts = myNamespace.GetDefaultFolder(olFolderContacts).Items 
 
 Set myItems = myContacts.Restrict("[LastModificationTime] > '01/1/2003'") 
 
 For Each myItem In myItems 
 
 If (myItem.Class = olContact) Then 
 
 MsgBox myItem.FullName & ": " & myItem.LastModificationTime 
 
 End If 
 
 Next 
 
End Sub

See also

ContactItem Object

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.