CALL "P$SETFONT" USING logicalFont  | 
logicalFont  | Group Item  | Group item with the following structure: 01 LogicalFont.    02  LF-Height          pic S9(5) Binary(2).    02  LF-Width           pic 9(5) Binary(2).    02  LF-Escapement      pic 9(5) Binary(2).    02  LF-Orientation     pic 9(5) Binary(2).    02  LF-WeightValue     pic 9(3) Binary(2).    02  LF-ItalicValue     pic x.    02  LF-UnderlineValue  pic x.    02  LF-StrikeoutValue  pic x.    02  LF-CharSetValue    pic 9(3) Binary(2).    02  LF-OutPrecisValue  pic 9 Binary(2).    02  LF-ClipPrecisValue pic 9(3) Binary(2).    02  LF-QualityValue    pic 9 Binary(2).    02  LF-PitchValue      pic 9 Binary(2).    02  LF-FamilyValue     pic 9 Binary(2).    02  LF-FaceName        pic x(31). Note - only these fields are supported: - LF-Height  - LF-Escapement  - LF-WeightValue  - LF-ItalicValue  - LF-UnderlineValue - LF-StrikeoutValue - LF-PitchValue   - LF-FaceName    | 
 CALL "P$SETFONT" USING settingName1, settingValue1                         [settingName2, settingValue2]                         ...                         [settingNameN, settingValueN]  | 
settingName1 settingName2 ... settingNameN  | PIC X(n)  | Specifies the setting name. Possible values are: "Height" "Escapement" "Weight" "Italic"  "Underline" "Strike Out" "Pitch"  "Face Name"  | 
settingValue1 settingValue2 ... settingValueN  | PIC X(n) or PIC 9(n) depending on the value type  | Specifies the setting value. Possible values are: Height -> any numeric value Escapement -> any numeric value Weight -> any numeric value Italic -> “Y”=italic, “N”=not italic Underline -> “Y”=underline, “N”=not underline Strike Out -> “Y”=strike out, “N”=not strike out Pitch -> 1= fixed pitch, 2= variable pitch Face Name -> any alphanumeric value  |