WSDefinition property of the form does not working rm 12.17 ...

Hi

I'm in process of upgrade applications from RM version 11 to RM ver 12 and for testing I'm using version 12.17 with WOW Extensions same version. The thing is that in version 11 I've used the form property WSDefinition in order to develop more complicated and large programs and also faster compilig. But when I use the test version 12.17, I got an error compiling when WSDefinition is enabled. 

Is there something am I missing?.

Thanks for any help.

Humberto Betancur.

101 +1+ 02 SOCKETTOOLSENCODE-CONTROL-HANDLES-ARRAY OCCURS 3 TIMES
102 +1+ REDEFINES SOCKETTOOLSENCODE-CTL-HS.
103 +1+ 03 FILLER.
104 +1+ 04 STANDARD-CONTROL-H PIC 9(10) BINARY(8).
105 +1+ 04 STANDARD-CONTROL PIC 9(10) BINARY(8)
106 +1+ REDEFINES STANDARD-CONTROL-H.
107 +1+ 04 ACTIVEX-CONTROL-H PIC X(8)
108 +1+ REDEFINES STANDARD-CONTROL-H.
109 +1+ 04 ACTIVEX-CONTROL PIC X(8)
110 +1+ REDEFINES ACTIVEX-CONTROL-H.
111 +1+ 04 CONTROL-TYPE PIC XX.
112 +1+ 88 CONTROL-TYPE-MAIN-MENU VALUE "MM".
113 +1+ 88 CONTROL-TYPE-SUB-MENU VALUE "SM".
114 +1+ 88 CONTROL-TYPE-STANDARD VALUE "SC".
RM/COBOL (Version 12.17) for 32-Bit Windows 04/06/2024 11:08:01 Page 3
Source file: sockettoolsencode.cbl Options: L L L

LINE DEBUG PG/LN -A 1 B..+....2....+....3....+....4....+....5....+....6....+....7....+....8....+....9....+....0....+....1...

115 +1+ 88 CONTROL-TYPE-ACTIVEX VALUE "AX".
116 +1+ 88 CONTROL-TYPE-RAW-OBJECT VALUE "RO".
117 +1+ 88 CONTROL-TYPE-NO-CONTROLS VALUE " ".
118 +1+
119 +1+ ******************************************************************
120 +1+ ******************************************************************
121 +1+ 03 FILLER PIC X(004) VALUE X"FFFFFFFC".
$
>>>>> 1) 0362: E VALUE clause is not permitted in redefinition.

122 +1+el/clsid follow
$$
>>>>> 1) 0039: W Indicator area contains wrong character.
>>>>> 2) 0138: E Data Division has wrong format. (scan suppressed).
>>>>> Previous diagnostic message occurred at line 121.

123 +1+ ***** License key info
124 +1+ ***** Event has output args info
125 +1+ ***** Event keypress info
126 +1+ ***** 2 int accel 3 bool follow
127 +1+ ***** Create a stream
128 +1+ ***** Stream info
129 +1+ ***** End of stream info
130 +1+ 03 FILLER PIC X(004) VALUE X"FFFFFFFC".
131 +1+el/clsid follow
$
>>>>> 1) 0039: W Indicator area contains wrong character.
>>>>> Previous diagnostic message occurred at line 122.

132 +1+ ***** License key info
133 +1+ ***** Event has output args info
134 +1+ ***** Event keypress info
135 +1+ ***** 2 int accel 3 bool follow
136 +1+ ***** Create a stream
137 +1+ ***** Stream info
138 +1+ ***** End of stream info
139 +1+ 03 FILLER PIC X(004) VALUE X"FFFFFFFC".
140 +1+el/clsid follow
$
>>>>> 1) 0039: W Indicator area contains wrong character.
>>>>> Previous diagnostic message occurred at line 131.

141 +1+ ***** License key info
142 +1+ ***** Event has output args info
143 +1+ ***** Event keypress info
144 +1+ ***** 2 int accel 3 bool follow
145 +1+ ***** Create a stream
146 +1+ ***** Stream info
147 +1+ ***** End of stream info
148 +1+ *
149 +1+WOWBGN*
150 +1+ *
151 +1+
152 +1+ *
153 +1+WOWDNE*
154 +1+ *
155
RM/COBOL (Version 12.17) for 32-Bit Windows 04/06/2024 11:08:01 Page 4
Source file: sockettoolsencode.cbl Options: L L L

LINE DEBUG PG/LN -A 1 B..+....2....+....3....+....4....+....5....+....6....+....7....+....8....+....9....+....0....+....1...

156 [0] COPY "WINDOWS.CPY".