ParagraphFormat.LineRuleAfter property (PowerPoint)
Determines whether line spacing after the last line in each paragraph is set to a specific number of points or lines. Read/write.
Syntax
expression. LineRuleAfter
expression A variable that represents a ParagraphFormat object.
Return value
MsoTriState
Remarks
The value of the LineRuleAfter property can be one of these MsoTriState constants.
Constant | Description |
---|---|
msoFalse | Line spacing after the last line in each paragraph is set to a specific number of points. |
msoTrue | Line spacing after the last line in each paragraph is set to a specific number of lines. |
Example
This example displays a message box that shows the setting for space after paragraphs for the text in shape two on slide one in the active presentation.
With Application.ActivePresentation.Slides(1).Shapes(2).TextFrame
With .TextRange.ParagraphFormat
sa = .SpaceAfter
If .LineRuleAfter Then
saUnits = " lines"
Else
saUnits = " points"
End If
End With
End With
MsgBox "Current spacing after paragraphs: " & sa & saUnits
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.