Dear Sir/Madam,

Need help to modify code below.
Dim a, requires assignment of 'hardcoded' text. a = "Main.NW.NE.SW.SE"
Need code to recurse each slide in presentation.
For each slide, Get text list from Text Placeholder 2.
Assign to Dim a.
Convert to any Hierarchical SmartArt.
List may have a 'bullet'. Bullet to be discarded for SmartArt.
Go to next slide and do same.

Struggling with extracting each list line from placeholder.
Any help, suggestion greatly appreciated.
Code from https://www.dotnetheaven.com/article...0-to-convert-t

Thank you.

Sub ConvertToSmartArtLayoutTest()
Dim vip As Slide
vip = ActivePresentation.Slides.Add(1, ppLayoutText)
Dim shp As Shape
shp = vip.Shapes(2)

' Create text with Main at the top level, and
' NW, NE, SW, SE as the four child paragraphs.

Dim a As String
a = "Main.NW.NE.SW.SE"
a = Replace(Text, ".", vbCrLf)

' Insert the text into the shape:
With shp.TextFrame.TextRange.Paragraphs
.Text = a
.Lines(2).IndentLevel = 2
.Lines(3).IndentLevel = 2
.Lines(4).IndentLevel = 2
.Lines(5).IndentLevel = 2

End With
' Now that the shape includes text that is appropriate
' for the smart art layout you'll use, convert it to
' the appropriate layout (121, Titled Matrix):

shp.ConvertTextToSmartArt(Application.SmartArtLayouts(121))
End Sub