CALL "P$GETTEXTMETRICS" USING textMetrics  | 
textMetrics  | Group Item  | Group item with the following structure: 01 TextMetrics.   02  TM-Height           pic 9(10) Binary(4).   02  TM-Ascent           pic 9(10) Binary(4).   02  TM-Descent          pic 9(10) Binary(4).   02  TM-InternalLeading  pic 9(10) Binary(4).   02  TM-ExternalLeading  pic 9(10) Binary(4).   02  TM-AveCharWidth     pic 9(10) Binary(4).   02  TM-MaxCharWidth     pic 9(10) Binary(4).   02  TM-WeightValue      pic 9(3) Binary(4).   02  TM-Overhang         pic 9(10) Binary(4).   02  TM-DigitizedAspectX pic 9(10) Binary(4).   02  TM-DigitizedAspectY pic 9(10) Binary(4).   02  TM-ItalicValue      pic x.   02  TM-UnderlinedValue  pic x.   02  TM-StruckOutValue   pic x.   02  TM-FirstChar        pic x.   02  TM-LastChar         pic x.   02  TM-DefaultChar      pic x.   02  TM-BreakChar        pic x.   02  TM-PitchValue       pic 9 Binary(2).   02  TM-FamilyValue      pic 9 Binary(2).   02  TM-CharSetValue     pic 9(3) Binary(2). Note - only these fields are supported: - TM-Height - TM-Ascent - TM-Descent - TM-InternalLeading  - TM-ExternalLeading  - TM-AveCharWidth - TM-MaxCharWidth - TM-WeightValue  - TM-ItalicValue   - TM-UnderlinedValue   - TM-StruckOutValue - TM-PitchValue   | 
 CALL "P$GETTEXTMETRICS" USING settingName1, settingValue1                                [settingName2, settingValue2]                                 ...                                [settingNameN, settingValueN]  | 
settingName1 settingName2 ... settingNameN  | PIC X(n)  | Specifies the setting name. Possible values are:   "Height"    "Ascent"    "Descent"    "Internal Leading"    "External Leading"    "Average Character Width"    "Maximum Character Width"    "Weight"       "Italic"    "Underlined"    "Struck Out"    "Pitch"   | 
settingValue1 settingValue2 ... settingValueN  | PIC X(n) or PIC 9(n) depending on the value type  | Receives the setting value.  |