Hi,
No, this is not a general limitation of the VBA interface. You can get all the released properties of all symbols (elements of the type 130) in a screen.
What you have done wrong is hard to tell with just the description, however my guess is that this is an issue in your VBA code, in the way how you go through all the elements in the screen and determine whether this is a symbol or not.
Below is a sample that uses a part of the frmSymbol example to get the released properties for all elements of the type 130 in the screen "a".
Sub get_sym_param()
Dim myPic As DynPicture
Dim myElem As Element
Dim vProps() As Variant
Dim v As Variant
Dim Result() As String
Dim syms As Integer
Dim k As Integer
Dim i As Integer
Dim n As Integer
Dim Pos As Integer
Dim s As String
Set myPic = MyWorkspace.ActiveDocument.DynPictures.Item("a")
syms = 0
If Not myPic Is Nothing Then
For k = 0 To myPic.Elements.Count - 1
Set myElem = myPic.Elements.Item(k)
If Not myElem Is Nothing Then
If myElem.Type = 130 Then
ReDim Preserve vProps(syms)
v = myElem.DynPropertiesEnum("")
ReDim Result(3, 0)
n = 0
For i = 0 To UBound(v)
s = v(i)
s = Mid(s, 1, InStr(1, s, ",") - 1)
If InStr(1, s, "\") <> 0 Then
Result(0, n) = Mid(s, 1, InStr(1, s, "\") - 1)
Result(1, n) = Mid(s, InStr(1, s, "\") + 1)
Pos = InStr(1, v(i), ",") + 1
Result(2, n) = Mid(v(i), Pos, InStr(Pos, v(i), ",") - Pos)
Pos = InStr(Pos, v(i), ",") + 1
Result(3, n) = Mid(v(i), Pos)
n = n + 1
ReDim Preserve Result(3, n)
End If
Next i
vProps(syms) = Result
syms = syms + 1
End If
End If
Next k
End If
End Sub