string |
√ |
√ |
Defined as COBOL PIC X() or C char[] with size determined by schema properties or toolset default. |
Defined as COBOL PIC X() or C char[] with size determined by schema properties or toolset default. |
Decimal |
√ |
√ |
Defined as COBOL PIC 9(?)V9(?) or C double with integer and decimal size determined by schema properties or toolset defaults. |
Defined as COBOL PIC 9(?)V9(?) or C double with integer and decimal size determined by schema properties or toolset defaults. |
integer |
√ |
√ |
Defined as COBOL PIC 9 or C long with size determined by schema properties or toolset default. |
Defined as COBOL PIC 9 or C long with size determined by schema properties or toolset default. |
byte, int, long, short, float |
|
|
Defined as COBOL PIC 9 or C equivalent with size determined by schema properties or toolset default. |
Defined as COBOL PIC 9 or C equivalent with size determined by schema properties or toolset default. |
negativeInteger,
nonNegativeInteger,
positiveInteger,
nonPositiveInteger,
unsignedLong,
unsignedInt,
unsignedShort,
unsignedByte |
√ |
√ |
Defined as COBOL PIC 9 or C equivalent with size determined by schema properties or toolset default.
Generated program logic to validate values received. |
Defined as COBOL PIC 9 or C equivalent with size determined by schema properties or toolset default.
Generated program logic to enforce only valid values inserted into document. |
Hex/Base64 |
√ |
√ |
|
|
date/time/dateTime with time zones
|
√ |
√ |
|
|
gDay, gMonth, gMonthDay, gYear, gYearMonth |
√ |
√ |
|
|
All primitive data types |
√ |
√ |
|
|
negativeInteger nonNegativeInteger positiveInteger nonPositiveInteger |
√ |
√ |
|
|
boolean |
√ |
√ |
Defined as COBOL PIC X(5) with 88 levels for "1", "0", "true" and "false". |
Defined as COBOL PIC X(5) with 88 levels for "1", "0", "true" and "false". |
enumeration |
√ |
√ |
Generated program logic to validate enumerated attributes received. |
Generated program logic to build enumerated attributes. |
fractionDigits |
√ |
√ |
Generated program logic to validate fraction digits received. |
Generated program logic to build fraction digits. |
Length |
√ |
√ |
Generated program logic to validate exactly length received. |
Generated program logic to build length. |
maxExclusive and maxInclusive |
√ |
√ |
Generated program logic to validate maximum value received. |
Generated program logic to ensure valid maximum values. |
maxLength |
√ |
√ |
Generated program logic to validate max length received. |
Generated program logic to build valid max length. |
minExclusive and minInclusive |
√ |
√ |
Generated program logic to validate minimum value received. |
Generated program logic to ensure valid minimum values. |
maxLength |
√ |
√ |
Generated program logic to validate maxLength received |
Generated program logic to build maxLength |
minLength |
√ |
√ |
Generated program logic to validate min length received. |
Generated program logic to build valid min length. |
pattern |
√ |
√ |
|
|
totalDigits |
√ |
√ |
Generated program logic to validate totalDigits received. |
Generated program logic to build totalDigits. |
whitespace |
√ |
√ |
Support whitespace "replace", "collapse", "preserve". |
Program code generated to support whitespace settings of "replace", "collapse", "preserve". |
maxOccurs |
√ |
√ |
Generated program logic to validate nodes, number of nodes received. |
Generated program logic to validate number of nodes received. |
minOccurs |
√ |
√ |
Generated program logic to validate nodes not received. |
Generated program logic to validate number of nodes received. |
Groups |
√ |
√ |
|
|
abstract types |
√ |
√ |
|
|
complexContent |
√ |
√ |
|
|
default value |
√ |
√ |
Returned by Reader when element or attribute does not exist in the document. |
Not used. |
Documentation Generation |
√ |
√ |
|
|
extension |
√ |
√ |
|
|
import |
√ |
√ |
|
|
include |
√ |
√ |
|
|
namespace |
√ |
√ |
Generated program logic to validate namespace received. |
Generated program logic to build valid namespace qualifiers. |
restriction |
√ |
√ |
|
|
Recursively defined elements |
√ |
√ |
|
|
substitutionGroups |
√ |
√ |
|
|
unions |
√ |
√ |
|
|