Linking the tables

Hi,
how to get the characteristics values which equals the pricing group value description.

Hello,
Check this.
* Selection for class
  IF NOT S_KLART[] IS INITIAL.
    PERFORM F_GET_OBJECTNUMBER.
  ENDIF.
  IF G_CLASS_NE IS INITIAL.
* Fill Selection table fields
    PERFORM F_FILL_FIELDS.
* Selection for materials
    PERFORM F_GET_MATERIAL.
    SORT G_T_MAT BY MATNR.
* Read if necessary classification
    IF G_T_MATNR[] IS INITIAL AND ( NOT G_T_MAT[] IS INITIAL ).
      PERFORM F_GET_MAT_KLASS.
    ENDIF.
* Select the basic data text and fill final table
    PERFORM F_GET_BASIC_TEXT.
  ENDIF.
*   INCLUDE Z48M_MATDATA_DOWN_NEW_F01                                  *
*&      Form  f_get_objectnumber
*       text
*  -->  p1        text
*  <--  p2        text
FORM F_GET_OBJECTNUMBER.
  DATA: L_R_OBJECTS  TYPE TY_OBJECTS.
  DATA: L_OBJECTS TYPE TY_OBJECTS.
  CLEAR: G_T_OBJECTS.
  REFRESH: G_T_OBJECTS.
  SELECT A~CUOBJ A~OBJEK A~KLART B~ATINN B~ATZHL B~ATWRT B~ATFLV
         B~ATAWE B~ATFLB B~ATAW1 C~CLINT D~CLASS
    INTO CORRESPONDING FIELDS OF TABLE G_T_OBJECTS
    FROM INOB AS A INNER JOIN AUSP AS B
      ON A~CUOBJ = B~OBJEK AND
         A~KLART = B~KLART
         INNER JOIN KSSK AS C
         ON B~OBJEK = C~OBJEK AND
            B~KLART = C~KLART
         INNER JOIN KLAH AS D
         ON C~CLINT = D~CLINT
   WHERE A~OBJEK IN S_MATNR AND
         A~OBTAB EQ 'MARA'  AND
         A~KLART IN S_KLART AND
         B~ADZHL EQ '0000'  AND
         C~LKENZ EQ ' '     AND
         D~CLASS IN S_CLASS.
  CLEAR : G_T_KSML.
  REFRESH: G_T_KSML.
  SELECT CLINT IMERK KLART
   FROM KSML
   INTO CORRESPONDING FIELDS OF TABLE G_T_KSML
    FOR ALL ENTRIES IN G_T_OBJECTS
  WHERE CLINT EQ G_T_OBJECTS-CLINT.
  IF NOT G_T_KSML[] IS INITIAL.
    SORT G_T_KSML BY CLINT.
    SORT G_T_OBJECTS BY CUOBJ OBJEK  CLASS ATINN.
    LOOP AT G_T_KSML.
      READ TABLE G_T_OBJECTS WITH KEY ATINN = G_T_KSML-IMERK
                                      CLINT = G_T_KSML-CLINT
                                      BINARY SEARCH.
      IF SY-SUBRC NE 0.
        CLEAR: L_OBJECTS.
        READ TABLE G_T_OBJECTS WITH KEY KLART = G_T_KSML-KLART
                                        CLINT = G_T_KSML-CLINT
                                        BINARY SEARCH.
        IF SY-SUBRC = 0.
          MOVE-CORRESPONDING G_T_OBJECTS TO L_OBJECTS.
          CLEAR G_T_OBJECTS.
          G_T_OBJECTS-ATINN = G_T_KSML-IMERK.
          G_T_OBJECTS-KLART = G_T_KSML-KLART.
          G_T_OBJECTS-CLINT = G_T_KSML-CLINT.
          G_T_OBJECTS-CUOBJ = L_OBJECTS-CUOBJ.
          G_T_OBJECTS-OBJEK = L_OBJECTS-OBJEK.
          G_T_OBJECTS-CLASS = L_OBJECTS-CLASS.
          APPEND G_T_OBJECTS.
          CLEAR G_T_OBJECTS.
        ENDIF.
      ENDIF.
    ENDLOOP.
  ENDIF.
  DELETE ADJACENT DUPLICATES FROM G_T_OBJECTS
                               COMPARING OBJEK KLART CLASS ATINN ATAWE.
  IF NOT G_T_OBJECTS[] IS INITIAL.
    SORT G_T_OBJECTS BY CUOBJ OBJEK  CLASS ATINN.
    CLEAR: G_T_MATNR,G_R_MATNR,G_T_CLASSDESC,G_T_CHARDESC,G_T_CABN,
           G_T_CAWNT.
    REFRESH: G_T_MATNR,G_T_CLASSDESC,G_T_CHARDESC,G_T_CABN,G_T_CAWNT..
    SELECT CLINT KSCHL
      FROM SWOR
      INTO CORRESPONDING FIELDS OF TABLE G_T_CLASSDESC
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE CLINT EQ G_T_OBJECTS-CLINT AND
           KLPOS EQ '01'              AND
           SPRAS EQ SY-LANGU.
    IF NOT G_T_CLASSDESC[] IS INITIAL.
      SORT G_T_CLASSDESC BY CLINT.
    ENDIF.
    SELECT ATINN ATBEZ
      FROM CABNT
      INTO CORRESPONDING FIELDS OF TABLE G_T_CHARDESC
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE ATINN EQ G_T_OBJECTS-ATINN AND
           SPRAS EQ SY-LANGU.
    IF NOT G_T_CHARDESC[] IS INITIAL.
      SORT G_T_CHARDESC BY ATINN.
    ENDIF.
    SELECT ATINN MSEHI
      FROM CABN
      INTO CORRESPONDING FIELDS OF TABLE G_T_CABN
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE ATINN EQ G_T_OBJECTS-ATINN.
    SELECT ATINN ATWTB
     FROM CAWNT
     INTO CORRESPONDING FIELDS OF TABLE G_T_CAWNT
      FOR ALL ENTRIES IN G_T_OBJECTS
    WHERE ATINN EQ G_T_OBJECTS-ATINN AND
          ADZHL EQ '0000'            AND
          SPRAS EQ SY-LANGU.
    LOOP AT G_T_OBJECTS.
      AT NEW OBJEK.
        G_R_MATNR-MATNR = G_T_OBJECTS-OBJEK.
        APPEND G_R_MATNR TO G_T_MATNR.
      ENDAT.
    ENDLOOP.
  ENDIF.
  IF G_T_MATNR[] IS INITIAL.
    G_CLASS_NE = 'X'.
  ENDIF.
ENDFORM.                    " f_get_objectnumber
*&      Form  f_fill_fields
*       text
*  -->  p1        text
*  <--  p2        text
FORM F_FILL_FIELDS.
  CLEAR: G_R_SELECT_FIELDS,G_T_SELECT_FIELDS.
  REFRESH: G_T_SELECT_FIELDS.
*--- MARA Fields
  G_R_SELECT_FIELDS-FIELD = 'MARA~MATNR'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~ERSDA'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~ZZBCODE'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~WRKST'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~LAENG'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~BREIT'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~HOEHE'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~ZZELKEN'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~MFRPN'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~MFRNR'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
  G_R_SELECT_FIELDS-FIELD = 'MARA~MATKL'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
*--- MAKT Fields
  G_R_SELECT_FIELDS-FIELD = 'MAKT~MAKTX'.
  APPEND G_R_SELECT_FIELDS TO G_T_SELECT_FIELDS.
ENDFORM.                    " f_fill_fields
*&      Form  f_get_material
*       text
*  -->  p1        text
*  <--  p2        text
FORM F_GET_MATERIAL.
  CLEAR: G_T_MAT.
  REFRESH: G_T_MAT.
  IF G_T_MATNR[] IS INITIAL.
    SELECT (G_T_SELECT_FIELDS)
    INTO CORRESPONDING FIELDS OF TABLE G_T_MAT
    FROM MARA
    INNER JOIN MAKT ON MAKT~MATNR EQ MARA~MATNR
                    AND MAKT~SPRAS EQ SY-LANGU
    WHERE MARA~MATNR   IN S_MATNR
      AND MARA~ERSDA   IN S_ERSDA
      AND MARA~ZZBCODE IN S_BCODE
      AND MARA~MFRPN   IN S_MFRPN
      AND MARA~MFRNR   IN S_MFRNR
      AND MARA~MATKL   IN S_MATKL
      AND MAKT~MAKTX   IN S_MAKTX.
  ELSE.
    SELECT (G_T_SELECT_FIELDS)
    INTO CORRESPONDING FIELDS OF TABLE G_T_MAT
    FROM MARA
    INNER JOIN MAKT ON MAKT~MATNR EQ MARA~MATNR
                   AND MAKT~SPRAS EQ SY-LANGU
      FOR ALL ENTRIES IN G_T_MATNR
    WHERE MARA~MATNR   EQ G_T_MATNR-MATNR
      AND MARA~ERSDA   IN S_ERSDA
      AND MARA~ZZBCODE IN S_BCODE
      AND MARA~MFRPN   IN S_MFRPN
      AND MARA~MFRNR   IN S_MFRNR
      AND MARA~MATKL   IN S_MATKL
      AND MAKT~MAKTX   IN S_MAKTX.
  ENDIF.
  IF NOT G_T_MAT[] IS INITIAL.
    CLEAR: G_T_LIEF.
    REFRESH: G_T_LIEF.
    SELECT LIFNR NAME1
      INTO CORRESPONDING FIELDS OF TABLE G_T_LIEF
      FROM LFA1
       FOR ALL ENTRIES IN G_T_MAT
     WHERE LIFNR EQ G_T_MAT-MFRNR.
  ENDIF.
ENDFORM.                    " f_get_material
*&      Form  f_get_mat_klass
*       text
*  -->  p1        text
*  <--  p2        text
FORM F_GET_MAT_KLASS.
  DATA: BEGIN OF L_T_OBJECT OCCURS 0,
         OBJEK TYPE OBJNUM,
         MATNR TYPE MATNR,
        END OF L_T_OBJECT.
  DATA: L_OBJECTS TYPE TY_OBJECTS.
  CLEAR: L_T_OBJECT.
  REFRESH: L_T_OBJECT.
* Fill the object number
  LOOP AT G_T_MAT INTO G_R_MAT.
    AT NEW MATNR.
      L_T_OBJECT-OBJEK = G_R_MAT-MATNR.
      L_T_OBJECT-MATNR = G_R_MAT-MATNR.
      APPEND L_T_OBJECT.
    ENDAT.
  ENDLOOP.
  CLEAR:G_T_OBJECTS,G_T_CLASSDESC,G_T_CHARDESC,G_T_CABN,G_T_KSML,
        G_T_CAWNT.
  REFRESH: G_T_OBJECTS,G_T_CLASSDESC,G_T_CHARDESC,G_T_CABN,G_T_KSML,
           G_T_CAWNT.
* Get the material classification details
  SELECT A~CUOBJ A~OBJEK A~KLART B~ATINN B~ATZHL B~ATWRT B~ATFLV
         B~ATAWE B~ATFLB B~ATAW1 C~CLINT D~CLASS
    INTO CORRESPONDING FIELDS OF TABLE G_T_OBJECTS
    FROM INOB AS A INNER JOIN AUSP AS B
      ON A~CUOBJ = B~OBJEK AND
         A~KLART = B~KLART
         INNER JOIN KSSK AS C
         ON B~OBJEK = C~OBJEK AND
            B~KLART = C~KLART
         INNER JOIN KLAH AS D
         ON C~CLINT = D~CLINT
     FOR ALL ENTRIES IN L_T_OBJECT
   WHERE A~OBJEK EQ L_T_OBJECT-OBJEK AND
         A~OBTAB EQ 'MARA'  AND
         A~KLART IN S_KLART AND
         B~ADZHL EQ '0000'  AND
         C~LKENZ EQ ' '     AND
         D~CLASS IN S_CLASS.
  IF NOT G_T_OBJECTS[] IS INITIAL.
    SELECT CLINT IMERK KLART
      FROM KSML
      INTO CORRESPONDING FIELDS OF TABLE G_T_KSML
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE CLINT EQ G_T_OBJECTS-CLINT.
  ENDIF.
  IF NOT G_T_KSML[] IS INITIAL.
    SORT G_T_KSML BY CLINT.
    SORT G_T_OBJECTS BY ATINN KLART.
    LOOP AT G_T_KSML.
      READ TABLE G_T_OBJECTS WITH KEY ATINN = G_T_KSML-IMERK.
      IF SY-SUBRC NE 0.
        CLEAR: L_OBJECTS.
        READ TABLE G_T_OBJECTS WITH KEY KLART = G_T_KSML-KLART.
        IF SY-SUBRC = 0.
          MOVE-CORRESPONDING G_T_OBJECTS TO L_OBJECTS.
          CLEAR G_T_OBJECTS.
          G_T_OBJECTS-ATINN = G_T_KSML-IMERK.
          G_T_OBJECTS-KLART = G_T_KSML-KLART.
          G_T_OBJECTS-CLINT = G_T_KSML-CLINT.
          G_T_OBJECTS-CUOBJ = L_OBJECTS-CUOBJ.
          G_T_OBJECTS-OBJEK = L_OBJECTS-OBJEK.
          G_T_OBJECTS-CLASS = L_OBJECTS-CLASS.
          APPEND G_T_OBJECTS.
          CLEAR G_T_OBJECTS.
        ENDIF.
      ENDIF.
    ENDLOOP.
  ENDIF.
  IF NOT G_T_OBJECTS[] IS INITIAL.
    SELECT CLINT KSCHL
      FROM SWOR
      INTO CORRESPONDING FIELDS OF TABLE G_T_CLASSDESC
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE CLINT EQ G_T_OBJECTS-CLINT AND
           KLPOS EQ '01'              AND
           SPRAS EQ SY-LANGU.
    IF NOT G_T_CLASSDESC[] IS INITIAL.
      SORT G_T_CLASSDESC BY CLINT.
    ENDIF.
    SELECT ATINN ATBEZ
      FROM CABNT
      INTO CORRESPONDING FIELDS OF TABLE G_T_CHARDESC
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE ATINN EQ G_T_OBJECTS-ATINN AND
           SPRAS EQ SY-LANGU.
    IF NOT G_T_CHARDESC[] IS INITIAL.
      SORT G_T_CHARDESC BY ATINN.
    ENDIF.
    SELECT ATINN MSEHI
    FROM CABN
    INTO CORRESPONDING FIELDS OF TABLE G_T_CABN
     FOR ALL ENTRIES IN G_T_OBJECTS
   WHERE ATINN EQ G_T_OBJECTS-ATINN.
    SELECT ATINN ATWTB
      FROM CAWNT
      INTO CORRESPONDING FIELDS OF TABLE G_T_CAWNT
       FOR ALL ENTRIES IN G_T_OBJECTS
     WHERE ATINN EQ G_T_OBJECTS-ATINN AND
           ADZHL EQ '0000'            AND
           SPRAS EQ SY-LANGU.
  ENDIF.
ENDFORM.                    " f_get_mat_klass
*&      Form  f_get_basic_text
*       text
*  -->  p1        text
*  <--  p2        text
FORM F_GET_BASIC_TEXT.
*  DATA: LV_ATWRT LIKE MARA-VOLUM.
*  DATA: L_MSEHI TYPE CABN-MSEHI.
  DATA: CHAR1(30).
  DATA: CHAR2(30).
  DATA: ZEILEN LIKE TLINE OCCURS 10 WITH HEADER LINE.
  DATA: ZEILEN1 LIKE TLINE OCCURS 10 WITH HEADER LINE.
  CLEAR: G_T_LIST.
  REFRESH: G_T_LIST.
  SORT G_T_LIEF BY LIFNR.
* Get the basic data texts
  LOOP AT G_T_MAT INTO G_R_MAT.
    CLEAR:G_T_LIST-MATNR, G_T_LIST-ERSDA,G_T_LIST-MAKTX,
          G_T_LIST-ZZBCODE,G_T_LIST-WRKST,G_T_LIST-LAENG,G_T_LIST-BREIT,
          G_T_LIST-HOEHE,G_T_LIST-ZZELKEN,G_T_LIST-MFRNR,G_T_LIST-NAME1,
          G_T_LIST-MFRPN,G_T_LIST-TDETAIL1,G_T_LIST-TDETAIL2,
          G_T_LIST-TDETAIL3,G_T_LIST-TDETAIL4,G_T_LIST-TDETAIL5,
          G_T_LIST-TDETAIL6,G_T_LIST-KLART,G_T_LIST-CLASS,
          G_T_LIST-KSCHL,G_T_LIST-KLART,G_T_LIST-CLASS,G_T_LIST-KSCHL,
          G_T_LIST-ATBEZ,G_T_LIST-ATWRT,G_T_LIST-VALFROM,G_T_LIST-UNIT1,
          G_T_LIST-VALTO, G_T_LIST-UNIT2,G_T_LIST-MATKL.
    MOVE-CORRESPONDING G_R_MAT TO G_T_LIST.
    CLEAR ZEILEN.
    REFRESH ZEILEN.
    SELECT SINGLE * FROM STXH WHERE TDOBJECT = 'MATERIAL'
                                AND TDNAME   = G_T_LIST-MATNR
                                AND TDID     = 'GRUN'
*                                AND TDSPRAS  = SY-LANGU.
                                 AND TDSPRAS  = 'DE'.
    IF SY-SUBRC = 0.
      CALL FUNCTION 'READ_TEXT'
           EXPORTING
                ID                      = STXH-TDID
                LANGUAGE                = STXH-TDSPRAS
                NAME                    = STXH-TDNAME
                OBJECT                  = STXH-TDOBJECT
           TABLES
                LINES                   = ZEILEN
           EXCEPTIONS
                ID                      = 1
                LANGUAGE                = 2
                NAME                    = 3
                NOT_FOUND               = 4
                OBJECT                  = 5
                REFERENCE_CHECK         = 6
                WRONG_ACCESS_TO_ARCHIVE = 7
                OTHERS                  = 8.
      IF SY-SUBRC <> 0.
* MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
*         WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
      ENDIF.
    ENDIF.
    READ TABLE ZEILEN INDEX 1.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL1 = ZEILEN-TDLINE.
    ENDIF.
    READ TABLE ZEILEN INDEX 2.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL3 = ZEILEN-TDLINE.
    ENDIF.
    READ TABLE ZEILEN INDEX 3.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL5 = ZEILEN-TDLINE.
    ENDIF.
    CLEAR ZEILEN1.
    REFRESH ZEILEN1.
    SELECT SINGLE * FROM STXH WHERE TDOBJECT = 'MATERIAL'
                                AND TDNAME   = G_T_LIST-MATNR
                                AND TDID     = 'GRUN'
                                AND TDSPRAS  = 'EN'.
    IF SY-SUBRC = 0.
      CALL FUNCTION 'READ_TEXT'
           EXPORTING
                ID                      = STXH-TDID
                LANGUAGE                = STXH-TDSPRAS
                NAME                    = STXH-TDNAME
                OBJECT                  = STXH-TDOBJECT
           TABLES
                LINES                   = ZEILEN1
           EXCEPTIONS
                ID                      = 1
                LANGUAGE                = 2
                NAME                    = 3
                NOT_FOUND               = 4
                OBJECT                  = 5
                REFERENCE_CHECK         = 6
                WRONG_ACCESS_TO_ARCHIVE = 7
                OTHERS                  = 8.
      IF SY-SUBRC <> 0.
* MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
*         WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
      ENDIF.
    ENDIF.
    READ TABLE ZEILEN1 INDEX 1.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL2 = ZEILEN1-TDLINE.
    ENDIF.
    READ TABLE ZEILEN1 INDEX 2.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL4 = ZEILEN1-TDLINE.
    ENDIF.
    READ TABLE ZEILEN1 INDEX 3.
    IF SY-SUBRC = 0.
      G_T_LIST-TDETAIL6 = ZEILEN1-TDLINE.
    ENDIF.
    READ TABLE G_T_LIEF WITH KEY LIFNR = G_R_MAT-MFRNR
                                 BINARY SEARCH.
    IF SY-SUBRC = 0.
      G_T_LIST-NAME1 = G_T_LIEF-NAME1.
    ENDIF.
    SORT G_T_OBJECTS BY OBJEK KLART CLASS ATINN.
    IF S_CLASS IS INITIAL.
      LOOP AT G_T_OBJECTS INTO G_R_OBJECTS
          WHERE OBJEK EQ G_R_MAT-MATNR.
        CLEAR: G_T_LIST-KSCHL,G_T_LIST-ATBEZ,G_T_LIST-ATWRT,
               G_T_LIST-VALFROM,G_T_LIST-VALTO,G_T_LIST-UNIT1,
               G_T_LIST-UNIT2,G_T_LIST-CLASS,G_T_LIST-KLART.
        READ TABLE G_T_CLASSDESC WITH KEY CLINT = G_R_OBJECTS-CLINT
                                          BINARY SEARCH.
        IF SY-SUBRC = 0.
          G_T_LIST-KSCHL = G_T_CLASSDESC-KSCHL.
        ENDIF.
        READ TABLE G_T_CHARDESC WITH KEY ATINN = G_R_OBJECTS-ATINN
                                         BINARY SEARCH.
        IF SY-SUBRC = 0.
          G_T_LIST-ATBEZ = G_T_CHARDESC-ATBEZ.
        ENDIF.
        CLEAR: CHAR1,CHAR2.
        IF G_R_OBJECTS-ATWRT IS INITIAL.
          WRITE: G_R_OBJECTS-ATFLV TO CHAR1 EXPONENT 0 DECIMALS 3.
          CONDENSE CHAR1 NO-GAPS.
          WRITE: G_R_OBJECTS-ATFLB TO CHAR2 EXPONENT 0 DECIMALS 3.
          CONDENSE CHAR2 NO-GAPS.
*          G_T_LIST-VALFROM = CHAR1.
*          G_T_LIST-VALTO = CHAR2.
          IF  G_R_OBJECTS-ATFLV IS INITIAL.
            READ TABLE G_T_CAWNT WITH KEY ATINN = G_R_OBJECTS-ATINN.
            G_T_LIST-VALFROM = G_T_CAWNT-ATWTB.
          ELSE.
            IF G_R_OBJECTS-ATAWE IS INITIAL.
              READ TABLE G_T_CABN WITH KEY ATINN = G_R_OBJECTS-ATINN.
              G_T_LIST-UNIT1 = G_T_CABN-MSEHI.
            ELSE.
              G_T_LIST-UNIT1 = G_R_OBJECTS-ATAWE.
            ENDIF.
            IF G_R_OBJECTS-ATAW1 IS INITIAL.
              READ TABLE G_T_CABN WITH KEY ATINN = G_R_OBJECTS-ATINN.
              G_T_LIST-UNIT2 = G_T_CABN-MSEHI.
            ELSE.
              G_T_LIST-UNIT2 = G_R_OBJECTS-ATAW1.
            ENDIF.
          ENDIF.
        ENDIF.
        G_T_LIST-KLART = G_R_OBJECTS-KLART.
        G_T_LIST-CLASS = G_R_OBJECTS-CLASS.
        G_T_LIST-ATWRT = G_R_OBJECTS-ATWRT.
        G_T_LIST-VALFROM = CHAR1.
        G_T_LIST-VALTO = CHAR2.
        APPEND G_T_LIST.
        CLEAR G_R_OBJECTS.
      ENDLOOP.
      IF SY-SUBRC NE 0.
        APPEND G_T_LIST.
      ENDIF.
    ELSE.
      LOOP AT G_T_OBJECTS INTO G_R_OBJECTS
          WHERE OBJEK EQ G_R_MAT-MATNR.
        READ TABLE G_T_CLASSDESC WITH KEY CLINT = G_R_OBJECTS-CLINT
                                          BINARY SEARCH.
        IF SY-SUBRC = 0.
          G_T_LIST-KSCHL = G_T_CLASSDESC-KSCHL.
        ENDIF.
        CLEAR: G_T_CHARDESC.
        READ TABLE G_T_CHARDESC WITH KEY ATINN = G_R_OBJECTS-ATINN
                                         BINARY SEARCH.
        IF SY-SUBRC = 0.
          G_T_LIST-ATBEZ = G_T_CHARDESC-ATBEZ.
        ENDIF.
*        CLEAR G_T_CABN.
*        IF G_R_OBJECTS-ATWRT IS INITIAL.
*          CLEAR G_T_CABN.
*          READ TABLE G_T_CABN WITH KEY ATINN = G_R_OBJECTS-ATINN.
*          IF SY-SUBRC = 0.
*            CALL FUNCTION 'CEVA_CONVERT_FLOAT_TO_CHAR'
*                 EXPORTING
*                      FLOAT_IMP  = G_R_OBJECTS-ATFLV
*                      FORMAT_IMP = 'P10(4)'
*                 IMPORTING
*                      CHAR_EXP   = G_R_OBJECTS-ATWRT.
*            IF G_R_OBJECTS-ATWRT CA ',.'.
*              REPLACE ',' WITH '.' INTO G_R_OBJECTS-ATWRT.
*              REPLACE '.' WITH '.' INTO G_R_OBJECTS-ATWRT.
*            ENDIF.
*            MOVE G_R_OBJECTS-ATWRT TO LV_ATWRT.
*          ENDIF.
*        ENDIF.
        G_T_LIST-KLART = G_R_OBJECTS-KLART.
        G_T_LIST-CLASS = G_R_OBJECTS-CLASS.
        G_T_LIST-ATWRT = G_R_OBJECTS-ATWRT.
*        G_T_LIST-MSEHI = G_T_CABN-MSEHI.
        APPEND G_T_LIST.
      ENDLOOP.
    ENDIF.
    CLEAR: G_R_MAT.
  ENDLOOP.
ENDFORM.                    " f_get_basic_text
Hope this will helps you,
Cheers,
Vasanth

Similar Messages

  • Linking the tables - Reg

    Hi,
    I want to know how to relate/link the BP Properities(OCQG-Table ) and OCRD.
    Regards
    Chidambaram

    Hi Chidambaram,
    If you need to link these two tables for creating query, it is better just leave the logic to condition clauses only.  The link between them is too weak for query purposes.
    Thanks,
    Gordon

  • Link the Tables:

    Hai gurus,
    When i access the table BLPR , system displays the followig message.
    No table entries found for the specified key.
    So my doubt is when system will update this table or how to access the table to display the stored value.
    i want to link the document log or item with reference to planned order.
    Thats why i checked that table(BLPR). Becoz in that tables (BLPK & BLPP) there is no link between planned order. So how to track the document log with reference to planned order. Is it possible with std or how to map this one? Pls give some logic...
    Please guide me.
    Thanks & regards,
    Meena

    <b>You can refer this report:-</b>
    tables: mchb, mara, lqua.
    data: begin of itab occurs 0,
          matnr type mchb-matnr,
          werks type mchb-werks,
          lgort type mchb-lgort,
          pradh type mara-prdha,
          wdatu type lqua-wdatu,
          end of itab.
    select-options: s_matnr for mchb-matnr,
                    s_prdha for mara-prdha,
                    s_wdatu for lqua-wdatu.
    start-of-selection.
      select * into corresponding fields of table itab
                from mchb
                      inner join mara
                          on mchbmatnr = maramatnr
                      inner join lqua
                          on mchbmatnr = lquamatnr
                         and mchbwerks = lquawerks
                                  where mchb~matnr in s_matnr
                                    and mara~prdha in s_prdha
                                    and lqua~wdatu in s_wdatu.
    Regards,
    Abhay Singh.
    <b>rewards point if useful.</b>

  • How to I link the table MARC with all the forecast table, eg MPOP

    Hi,
    Can anyone tell me how do I link the marc table with all the forecast structure?
    I am trying to create an abap extraction query
    thanks

    Hi,
    Please check the below links..
    MM43: Forecast Values Table
    http://www.se80.co.uk/sapfms/m/mass/mass_marc_read.htm
    http://www.se80.co.uk/sapfms/m/mass/mass_marc_merge.htm
    and also try with FM - MATERIAL_FORECAST_DISPLAY..
    Hope it may help you...
    Kuber

  • What are the tables that Contains DTP Filter Entries

    Hello,
    for the filter entries on a DTP Process I found the table RSBKSELECT "Selections for DTP Request (Summary)". But that holds only value which are done generic by Formula etc. but not the information which are entered manual.
    Does anybody knows the table for the rest of entries ??
    I need this Information to Report these Filter as Selectioncriteria.
    Thank for any help
    Henning

    Hi,
    Please note that I was able to link the tables by this kind of code:
    "Get the request from the cube, to identify them.
        CALL FUNCTION 'RSSM_ICUBE_REQUESTS_GET'
          EXPORTING
            i_infocube     = LV_IC
          IMPORTING
            e_t_request    = LT_REQUEST
          EXCEPTIONS
            wrong_infocube = 1
            internal_error = 2
            others         = 3.
    "Check each request
        LOOP AT LT_REQUEST INTO LS_REQUEST.
          "Populate LV_REQUID_CHAR to be able to read the table RSBKSELECT
          "The key is : Request id, without leading 0, right justified, and shifted one time to the left.
          LV_REQUID_CHAR = LS_REQUEST-PARTNR.
          SHIFT LV_REQUID_CHAR LEFT DELETING LEADING '0'.
          SHIFT LV_REQUID_CHAR RIGHT DELETING TRAILING SPACE.
          SHIFT LV_REQUID_CHAR LEFT.
          "Get the filters
          SELECT  *
            INTO TABLE LT_RSBKSELECT
            FROM RSBKSELECT
            WHERE REQUID = LV_REQUID_CHAR.
    ENDLOOP.
    The internal table LT_RSBKSELECT will now contains all the filters used by the DTP.
    It is way better than using the field that contains the concatenation of all filters since it is limited to 255 characters.
    Hope it helps.

  • Link between tables J_1IEXCDTL and BSEG

    Hai,
    Can someone tell me how I can link the tables J_1IEXCDTL(CIN Table) and BSEG.
    Please help.
    Thanks in advance
    Binoo

    You could create and ABAP Query infoset and create your tables links there. Or you can create an ABAP dictionary view.

  • Help linking 3 tables

    I have two different tables with the same field in it.
    Table 1 (current) contains DEPT #
    Table 2 (historic) contains DEPT #
    Table 3  contains DEPT NAME
    When I try to add all 3 fields to a one report. It either names the current DEPT or the historic DEPT depending on how I link the tables.  Is there a way to link the tables to name each DEPT# even if they are different?
    Here is what I am getting when I run my report:
    DEPT # (current)    DEPARTMENT NAME            DEPT#(historic)        DEPARTMENT NAME
    1111B                     Human Resources                  2222B                    Human Resources
    I want it to show like this:
    DEPT # (current)    DEPARTMENT NAME            DEPT#(historic)        DEPARTMENT NAME
    1111B                     Human Resources                  2222B                    Payroll Department
    Any help would be appreciated.  Thank you.

    Well if that's the case you should also have an Employee table as well... Or there should at least be employee numbers in each of the current / historical tables.
    So IF there's an Employee Table:
    EmployeeTable
    LEFT OUTER JOIN Current Linked on EmployeeTable.EmployeeID = Current.EmployeeID (with EmployeeTable on the left)
    LEFT OUTER JOIN Historical Linked on EmployeeTable.EmployeeID = Historical.EmployeeID (with EmployeeTable on the left)
    LEFT OUTER JOIN DeptNameTable ON Current.Dept# = DeptNameTable.Dept# (with Current on the left)
    LEFT OUTER JOIN DeptNameTable_2 ON Historical.Dept# = DeptNameTable_2.Dept# (with Historical on the left)
    Yes... you'll be adding DeptNameTable twice.
    If there is no EmployeeTable  then just start with Current and link Historical directly to it using the EmployeeID (the thought being that there won't be any historical if there isn't a current...).
    HTH,
    Jason

  • Is Acrobat Pro right for us. We have an Employee Handbook that needs editing. Some is current pdf, some from an older version. Want to get all into one handbook, have the table of contents automatically adjust and link to specific pages from the ToC.

    Is Acrobat Pro right for us. We have an Employee Handbook that needs editing. Some is current pdf, some from an older version. Want to get all into one handbook, have the table of contents automatically adjust and link to specific pages from the ToC.

    You can download the trial version (http://helpx.adobe.com/acrobat/kb/acrobat-downloads.html) to convert the PDF back to WORD if you do not have the original. The conversion may not be perfect, but it is typically better than starting from scratch. You may be lucky and get a good result. You might check the settings (in the save screen) to try retain format versus retain text flow. The format version can be a pain to edit since it creates a bunch of text boxes. The flow version may require you to reformat in WORD, but you likely would want to do that anyway.

  • Dont know how to link the relationships in these tables?

    I have one table called holiday_details and another called date_holiday. I am trying to link the two together.
    The column i am trying to link in the holdiay_details is holiday_code. This is the primary key in this table and a foreign key i want to link to date_holiday.
    In the date_holiday there is a holiday_code column and a date_departed column.
    For this table the same holiday can have many departure dates. E.g H1 (holiday_code) - 10-17-2010(date_departed). H1 - 11-20-2010. However the same holiday cant leave on the same date more than once. e.g H1 - 10-17-2010 = unique constraint violated.
    Therefore i made a unique composite key of the two columns (holiday_code and date_departed) together.
    When i try to reference holiday_code from my holiday_details column to my holiday_code on the date_holiday it wont work. Cant i reference it because it is a composite unique key? I dont know any other way to reference it. I cant make either the primary key, they have to be unique together.
    Does anyone have a solution? Im completely stuck and any help would be greatly appreciated. Thanks in advance!

    Jay,
    I can't say to have a solution but will make some recommendations.
    <li>Google Oracle Database Naming Conventions and find a better method of naming your tables, keys and attributes. Doing so will make your data structures and data models easier to understand.</li>
    <li>Key both of your tables by Sequence</li>
    <li>Document further what each of these tables represents and determine what the remaining attributes would be for each table.</li>
    <li>Data model using SQL Developer or any other data modeling tool, an ERD in my opinion is much easier to read and later is a road map while developing and enhancing your application</li>
    From what I could understand, I modeled the following:
    holiday_tbl with a PK of holiday_seq (sequence)
    holiday_departure_tbl with a PK of holiday_departure_seq and a FK key of holiday_seq
    This would establish a one to many relationship, holiday_tbl to holiday_departure_tbl or holidays have one to many departures.
    Your business rule of, a holiday can only one depart once on a given date, could be enforced either on the database or within your application.
    Hope this helps you out.
    Jeff

  • Possible to link the two tables?

    Dear All,
    I am currently trying to create a report where the user will enter in the customer code and then using discounts on item groups to create a sales price (list price - customer discount = sales price). I'm currently trying to do this in crystal reports but I just can't seem to get the values.
    The problem I have is the OITM.Itemgroupcode is of type number (from the item table) where the OSPG.ObjKey is of type string (this represents the itemgroup code in the Discount table). Because of the different types I cannot link the two fields. If they were the same then it should be easy but I can't seem to get around this.
    Does anyone have any idea of what I could do to resolve my issue, while I am trying to do this with crystal currently I'm not locked into using this platform.
    Any help and comments are much appreciated.
    Troy

    Hi Troy,
    Welcome you post on the forum.
    Try this to start:
    SELECT T0.ItemCode, T1.CardCode, T1.Discount
    FROM OITM T0
    INNER JOIN OSPG T1 ON CAST(T1.ObjKey AS INT)=T0.ItmsGrpCod
    WHERE T0.ItmsGrpCod like '[%0\]%'
    If you get result, you can create a Command for your CR report.
    Thanks,
    Gordon

  • How to find out the link for the tables for sub contract PO

    Dear All,
    How to find out the link for the tables for sub contract PO, I am looking for the fields Material, Unit, Batch no., quantity.
    Please provide the solution for the Table related to ABAP.
    Thanks,
    V.V.

    Hi,
       Make use of the table EKKO, EKPO...
    For subcontract please select the option in EKPO-PSTYP.
    Regards
    GK.

  • What are the tables involved in hierarchy of cost centers?How to link them?

    I want to generate  the report  for the GFIMs attached o the cost centers.
    It should be similar to the  transaction OKENN .
    if a cost center is having an hiearchy , a cost group then will go on taking the parent node till  the last node.
    Which are the tables used in the transaction OKENN?
    which are the tables which links the hierarchy of the cost centers.How is it linked.

    It is a simple process to trace the transaction (ST05/SE30) and discover the information for yourself...

  • I am trying to link to page in my document from the table of contents.  How can this be done?

    I am trying to link to page in my document from the table of contents.  How can this be done?

    The Table of Contents picks up selected named Styles in the text like Head 1, 2 etc.
    Have you actually applied the styles?
    Peter

  • Linking between the tables

    Hi all.
    i wish to know the common table between tables eban,ekko,ekpo and eket.
    As their is no common key field although ebeln and ebelp are there but their check tables are different,
    please guide me how to link these tables.
    As my select query is showing the data available and read table is also showing the data coming but may be because the ebeln can be differnet for diffrent table thats why  iam not geting any display.
    please guide

    Hi,
       Iam kiran posanapalli, just try out this by linking up table with the common fields provided.
    **************EBAN---Purchase Requisition*****************************
    BANFN     BANFN     CHAR     10     0     Purchase Requisition Number
    BNFPO     BNFPO     NUMC     5     0     Item Number of Purchase Requisition
    ********************EKKO-------Purchasing Document Header**************
    EBELN     EBELN     CHAR     10     0     Purchasing Document Number
    **********************EKPO-------Purchasing Document Item*********
    EBELN     EBELN     CHAR     10     0     Purchasing Document Number
    EBELP     EBELP     NUMC     5     0     Item Number of Purchasing Document
    BANFN     BANFN     CHAR     10     0     Purchase Requisition Number
    BNFPO     BNFPO     NUMC     5     0     Item Number of Purchase Requisition
    ***************EKET----Scheduling Agreement Schedule Lines*************
    EBELN     EBELN     CHAR     10     0     Purchasing Document Number
    EBELP     EBELP     NUMC     5     0     Item Number of Purchasing Document
    ETENR     EETEN     NUMC     4     0     Delivery Schedule Line Counter
    BANFN     BANFN     CHAR     10     0     Purchase Requisition Number
    BNFPO     BNFPO     NUMC     5     0     Item Number of Purchase Requisition
    Regards,
    Kiran Posanapalli

  • Linking to PDF Files in the Table of Contents

    I know there is a way to link directly to a PDF file from the table of contents, but it is beyond me. Anyone know how to do this?
    Thanks, Kathy

    Hi Kathy
    It's probably advisable to first add the PDF as a Baggage File. Then when you are creating the TOC entry point, you point at the Baggage File.
    If that wasn't what you were hoping to see, you could also do it by simply linking to the PDF as you would a Web Page by specifying the explicit URL that would open the same file if you were doing it using a browser.
    Cheers... Rick
    Helpful and Handy Links
    RoboHelp Wish Form/Bug Reporting Form
    Begin learning RoboHelp HTML 7 or 8 within the day - $24.95!
    Adobe Certified RoboHelp HTML Training
    SorcerStone Blog
    RoboHelp eBooks

Maybe you are looking for

  • Conditional SQL in Report Query

    How can I code a conditional SQL in the Report query builder to include a WHERE clause parameter or not, depending on the value of a report parameter? Basically, what I want to do is: select field from table where x=1 <cfif param.a eq 1>and a=1</cfif

  • Mac iTunes won't open; error 13010

    Running the newly updated iTunes on my Mac; the one with Genius support (not sure if I actually like that feature or not); anyway, I was in the midst of synching with my iPod shuffle when my Mac indicated that I needed to hold down the "Power" key, w

  • Problem in compiling with -g option

    I am using forte5.1 compiler. While compiling my whole source code with -g option, for some of the files, the compilation is successfully but for some files I am getting en error as ">> Assertion (../link/dbg_stcomm.cc, line 271) while processing srs

  • Monochrome in Aperture with PS CS3

    Hi, I have opened a photo in Aperture and created a B&W image in PS CS3(+blur etc) but now the image can't be viewed in Aperture anymore. It stays completey black and to view I have to open via PS CS3. Any ideas?? Thanks!!! Peter MBP 2.33 GHZ 2Gb 120

  • Loading xml data to a oracle database problem in style sheet

    Hi, I Have one small Problem While loading xml data to a oracle database. In the XML i have the Columns and Data Like this. <Data> <TRAN> <Type_Trs>A</Type_Trs> <T1>2</T1> <T2>3</T2> </TRAN> <TRAN> <Type_Trs>B</Type_Trs> <T1>2</T1> <T2>3</T2> </TRAN>