Task.Name property (Project)

Gets or sets the name of a Task object. Read/write String.

Syntax

expression.Name

expression A variable that represents a Task object.

Example

The following example displays the task names that contain the specified text.

Sub NameExample() 
    Dim t As Task 
    Dim x As String 
    Dim y As String 
 
    x = InputBox$("Search for tasks that include the following text in their names:") 
 
    If Not x = "" Then 
        For Each t In ActiveProject.Tasks 
            If InStr(1, t.Name, x, 1) Then 
                y = y & vbCrLf & t.ID & ": " & t.Name 
            End If 
        Next t 
 
        If Len(y) = 0 Then 
            MsgBox "No tasks with the text " & x & " found in the project", vbExclamation 
        Else 
            MsgBox y 
        End If 
    End If 
End Sub

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.