Effect.TextRangeLength property (PowerPoint)

Returns or sets a Long that represents the length of a text range. Read-only.

Syntax

expression. TextRangeLength

expression A variable that represents a Effect object.

Return value

Long

Example

This example adds a shape with text and rotates the shape without rotating the text.

Sub SetTextRange()

    Dim shpStar As Shape
    Dim sldOne As Slide
    Dim effNew As Effect

    Set sldOne = ActivePresentation.Slides(1)
    Set shpStar = sldOne.Shapes.AddShape(Type:=msoShape5pointStar, _
        Left:=32, Top:=32, Width:=300, Height:=300)

    shpStar.TextFrame.TextRange.Text = "Animated shape."
    Set effNew = sldOne.TimeLine.MainSequence.AddEffect(Shape:=shpStar, _
        EffectId:=msoAnimEffectPath5PointStar, Level:=msoAnimateTextByAllLevels, _
        Trigger:=msoAnimTriggerAfterPrevious)

    With effNew
        If .TextRangeStart = 0 And .TextRangeLength > 0 Then
            With .Behaviors.Add(Type:=msoAnimTypeRotation).RotationEffect
                .From = 0
                .To = 360
            End With
            .Timing.AutoReverse = msoTrue
        End If
    End With

End Sub

See also

Effect 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.