XML Extension + RM/COBOL Program

I am trying to use 2 below copybooks.

 

SGUPTA     COPY "lixmlall.cpy".            == > standard xml copybook

T01153     COPY "XXXBUF.CPY".              == > Internal copybook.

 

I place tdhem just before the linkage section. But kept on getting error like

 

170651    973767   SGUPTA     XML INITIALIZE

                              $   $

>>>>>   1) 0465: E Verb expected. (scan suppressed).

>>>>>   2) 0005: I Scan resumed.

 

170653             SGUPTA     XML GET UNIQUEID

                              $

>>>>>   1) 0263: E Identifier is not defined. (scan suppressed).

>>>>> Previous diagnostic message occurred at line 170651.

 

 

 

XXXBUF copybook looks like

 

       01  XXX--PARM                   PIC X(30).

       REPLACE ==XXX-FILE== BY

               ==CALL "CEAECXXXREC" USING  XXX-PARAM==

                                          .

 If I changed the order of 2 copybook then getting same message for XXX-FILE