Effect.Exit property (PowerPoint)
Determines whether the animation effect is an exit effect. Read/write.
Syntax
expression. Exit
expression A variable that represents an Effect object.
Return value
MsoTriState
Remarks
The value of the Exit property can be one of these MsoTriState constants.
Constant | Description |
---|---|
msoFalse | The effect is not an exit effect. |
msoTrue | The effect is an exit effect. |
Example
This example displays whether the specified animation is an exit animation effect.
Sub EffectExit()
Dim effMain As Effect
Set effMain = ActivePresentation.Slides(1).TimeLine.MainSequence(1)
If effMain.Exit = msoTrue Then
MsgBox "This is an exit animation effect."
Else
MsgBox "This is not an exit animation effect."
End If
End Sub
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.