Adding an additional field in XL Reporter reports

Hello All,
I have assigned additional document number in A/R Invoice through a sequence number.  I want to add this sequence number in XL Reporter Sales Register.  How can I add an additional field in XL Reporter.
Thanks,
Pratheeviraj

Hi Pratheeviraj
Do you mean that you want to see a UDF? If yes then go to Report Composer and and under the tools menu you will find the Manage UDFs window.
Hope this helps.
Stewart Clark

Similar Messages

  • How to add Additional fields in standard SAP Report RMCLOBJVN ,TCODE CL6BN

    i am facing problem in Report RMclobjvn , TCODE is CL6BN
    i have to add some additional fields on the result screen.
    but when i search inside the report i could not retrieve any user exits but through a search utility i got 4 user exits of which 2 seem to be useful.these are
    <b>Exit name
    CLCLRS01  Additional Fields on the Result Screen
    CLCLRS02  Fill the Additional Fields on the Result Screen</b>
    i activated the these exits and have tried putting in break point in side the include.
    But the problem is this that
    [<b>b]that CL6BN Tcode is not triggering anyhow these userexits.</b></b>
    does anyone has any solution for adding the additional fields.

    Hai Manish
    Check the following Links
    You can do it in two ways using append structure or include structure of that standard table.
    once you added , you need to adjust it and activate using the menu utilities->data base utulity-> Activate and Adjust .
    check this SAP help..
    for append structure
    http://help.sap.com/saphelp_nw04/helpdata/en/cf/21eb61446011d189700000e8322d00/frameset.htm
    for include structure.
    http://help.sap.com/saphelp_nw04/helpdata/en/cf/21eb54446011d189700000e8322d00/content.htm
    Regards
    Sreeni

  • How to add additional field to the existing report

    hi,
    report name is RHXPE_EXPIRED_QUALI
    if u execute report alv list is genereted with like this.
    object type, id of related object, object name, object type, id of related object,last name, first name like this
    where can i get these field descriptios in the prigram becoz many perform ststements r there. i want to add additional field text.
    program is:
    CORRECTIONS
    DATE       CORRECTION NOTE    AUTHOR DESCRIPTION
    09.03.2001            0388404 XSC    Wrong list output for multiple Os
    05.06.2001 AL0K023393 0410219 Lud    Wrong keydate for search with
                                         Pchbegda and pchendda.
    30.01.2002 S6BK000033 0491055 TS     Report: RHXPE_EXPIRED_QUALI
                                         doesn't provide a spool list.
    REPORT rhpk_find_pers_with_expired_qu MESSAGE-ID pq.
    TABLES : pchdy.
    INCLUDES
    INCLUDE rhxmacro.
    INCLUDE rhpeini0.
    TABLES
    DATA: objects  LIKE hrsobid    OCCURS 1 WITH HEADER LINE.
    VARIABLES
    DATA: subrc LIKE sy-subrc.
    DATA: orgeh_text LIKE t777o-otext.
    SELECTION SCREEN
    objid
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME.
    PARAMETERS:
       pchplvar LIKE p1000-plvar NO-DISPLAY,    "plan version
       pchotype LIKE pchdy-otype NO-DISPLAY. "objecttype
    Objid
    rhx-f4-objid-data.
    SELECT-OPTIONS:  pchobjid FOR pchdy-objid_str NO INTERVALS.
    Search
    PARAMETERS:
      pchseark LIKE pchdy-seark.           "matchcode object plom.
    SELECTION-SCREEN END OF BLOCK b1.
    Objecttime
    SELECTION-SCREEN BEGIN OF BLOCK b2 WITH FRAME TITLE text-001.
    PARAMETERS: se_begd LIKE  p1000-begda DEFAULT sy-datum,  "'19000101',
                se_endd LIKE  p1000-endda DEFAULT high_date.
    SELECTION-SCREEN END OF BLOCK b2.
    SELECTION-SCREEN BEGIN OF BLOCK b3 WITH FRAME TITLE text-005.
    PARAMETERS:
       h_events LIKE dynp_rhpp-gen_train,  "with training sugg
       h_qual LIKE dynp_rhpp-expired_qual. "with Qual
    SELECTION-SCREEN END OF BLOCK b3.
    AT SELECTION-SCREEN ON pchobjid.
      PERFORM check_objid_sign(rhxchk00) USING pchobjid-sign.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR pchobjid-low.
      rhx-f4-objid-low pchplvar pchotype pchobjid '' ''.
    AT SELECTION-SCREEN.
      PERFORM check_plvar(rhxchk00) USING pchplvar.
      PERFORM check_seark(rhxchk00) TABLES pchobjid
                                    USING  pchseark pchplvar pchotype.
    INITIALIZATION
    INITIALIZATION.
      PERFORM read_t77s0_parameters_for_pe.
    get user parameters/Planvariante und Beginndatum setzen:
      pchotype = $orgeh.
      CALL FUNCTION 'RHP0_USER_PARAMETERS_GET'
           EXPORTING
                fill_if_initial = 'X'
           IMPORTING
                plvar           = pchplvar
                begda           = se_begd
                endda           = se_endd
              with_key        =
              SUBSTITUTE      =
              ESSENTIAL       = only_essential
                org_unit        = pchobjid-low
          EXCEPTIONS
                OTHERS     = 0.
    SE_BEGD = LOW_DATE.   "Correction AL0K023393 0410219
      IF NOT pchobjid-low IS INITIAL.
        pchobjid-sign   = 'I'.
        pchobjid-option = 'EQ'.
        APPEND pchobjid.
      ENDIF.
    START-OF-SELECTION
    START-OF-SELECTION.
    correction 0491055
    correction was done for getting a spool list in background-processing.
      CASE sy-batch.
        WHEN space.
          SUBMIT rhpe_expired_quali
               WITH pchplvar = pchplvar
               WITH pchotype = pchotype
               WITH pchobjid IN pchobjid
               WITH pchbegda = se_begd
               WITH pchendda = se_endd
               WITH h_qual = h_qual
               WITH h_events = h_events
                      AND RETURN.
        WHEN 'X'.
          SUBMIT rhpe_expired_quali
               WITH pchplvar = pchplvar
               WITH pchotype = pchotype
               WITH pchobjid IN pchobjid
               WITH pchbegda = se_begd
               WITH pchendda = se_endd
               WITH h_qual = h_qual
               WITH h_events = h_events
                      TO SAP-SPOOL.
      ENDCASE.
    END-OF-SELECTION
    END-OF-SELECTION.

    Hi,
    I think you need to show more programs.
    you said, the report program is 'RHXPE_EXPIRED_QUALI', but you upload  'rhpk_find_pers_with_expired_qu' program.
    usually, ALV field is modifyed in 'PERFORM fieldcatalog_modify', if you use Functional ALV.
    Try to search 'fieldcatalog function', you will find easy.
    Regard,
    SY Kim

  • Adding a new Field to an existing report

    Hi all,
    Can anybody tell me, how to add an extra field in existing
    report, without changing the basic calulation, which i made
    in the same report.
    Regards
    Hema

    okay... that is not a standard program.
    sombody developed it.following is my existing code, here in last column i want to add BOM(mast-stlnr) and Component(stpo-idnrk). remaining things are okay.
    REPORT ZPOTREND NO STANDARD PAGE HEADING
                      LINE-SIZE 195
                      LINE-COUNT 60(3)
                      MESSAGE-ID Z1.
    TABLES: EKBE,
            MARA,
            TCURR.
    SELECT-OPTIONS: S_GJAHR FOR EKBE-GJAHR,
                    S_BUDAT FOR EKBE-BUDAT DEFAULT SY-DATUM NO-EXTENSION,
                    S_MATNR FOR EKBE-MATNR,
                    S_WERKS FOR EKBE-WERKS DEFAULT 'CE',
                    S_MTART FOR MARA-MTART.
    PARAMETERS: X_APP_L TYPE P DECIMALS 2 NO-DISPLAY,
                X_APP_H TYPE P DECIMALS 2 NO-DISPLAY,
                X_DTL   AS CHECKBOX.
    DATA: BEGIN OF I_EKBE OCCURS 0,
          BUDAT LIKE EKBE-BUDAT,
          MENGE LIKE EKBE-MENGE,
          DMBTR LIKE EKBE-DMBTR,
          SHKZG LIKE EKBE-SHKZG,
          EBELN LIKE EKBE-EBELN,
          MATNR LIKE EKBE-MATNR,
          WERKS LIKE EKBE-WERKS,
          MTART LIKE MARA-MTART,
          MEINS LIKE MARA-MEINS,
    END OF I_EKBE.
    DATA: P_EBELN LIKE EKBE-EBELN,
          P_MATNR LIKE EKBE-MATNR,
          P_WERKS LIKE EKBE-WERKS,
          P_MTART LIKE MARA-MTART,
          P_MEINS LIKE MARA-MEINS.
    DATA: BEGIN OF YMTH OCCURS 10,
          YYMM(6),
          MTH(3),
          COL TYPE I,
          MENGE LIKE EKBE-MENGE,
          DMBTR LIKE EKBE-DMBTR,
    END OF YMTH.
    DATA: S_YMTH LIKE YMTH OCCURS 10 WITH HEADER LINE.
    DATA: W_YMTH LIKE YMTH OCCURS 10 WITH HEADER LINE.
    DATA: G_YMTH LIKE YMTH OCCURS 10 WITH HEADER LINE.
    DATA: S_FLAG.                                               "MTART FLAG
    DATA: BEGIN OF CDATE,
          YYMM(6),
          DD(2) VALUE '01',
    END OF CDATE.
    DATA: SDATE LIKE SY-DATUM.
    DATA: CMTH(6),
          PMTH(6),
          LMTH1(6),
          LMTH2(6),
          MTH(2).
    DATA: W_MENGE LIKE EKBE-MENGE,
          W_DMBTR LIKE EKBE-DMBTR,
          W_MENGE1 LIKE EKBE-MENGE,
          W_DMBTR1 LIKE EKBE-DMBTR,
          W_TOTAL TYPE P DECIMALS 2,
          W_COL TYPE I,
          WTEXT(18),
          APP TYPE P DECIMALS 4,
          APP1 TYPE P DECIMALS 4,
          APP2 TYPE P DECIMALS 4.
    PERFORM GET_YMTH.
    SELECT P~BUDAT P~MENGE P~DMBTR P~SHKZG P~EBELN P~MATNR P~WERKS
           Q~MTART Q~MEINS
           INTO TABLE I_EKBE
             FROM EKBE AS P INNER JOIN MARA AS Q
           ON P~MATNR = Q~MATNR
           WHERE P~GJAHR IN S_GJAHR
             AND P~BUDAT IN S_BUDAT
             AND P~MATNR IN S_MATNR
             AND P~WERKS IN S_WERKS
             AND P~BEWTP = 'E'
             AND Q~MTART IN S_MTART.
    FORMAT INTENSIFIED OFF.
    IF X_DTL <> 'X'.
       LOOP AT I_EKBE.
          I_EKBE-EBELN = SPACE.
          MODIFY I_EKBE.
       ENDLOOP.
    ENDIF.
    SORT I_EKBE BY WERKS MTART MATNR EBELN BUDAT.
    LOOP AT I_EKBE.
      CMTH = I_EKBE-BUDAT(6).
      IF P_WERKS IS INITIAL.
        P_WERKS = I_EKBE-WERKS.
        P_MTART = I_EKBE-MTART.
        P_MATNR = I_EKBE-MATNR.
        P_EBELN = I_EKBE-EBELN.
        P_MEINS = I_EKBE-MEINS.
        PMTH = CMTH.
      ENDIF.
      IF P_WERKS NE I_EKBE-WERKS.
        PERFORM CHG_MTH.
        PERFORM CHG_MATNR.
        PERFORM CHG_MTART.
        PERFORM CHG_WERKS.
      ENDIF.
      IF P_MTART NE I_EKBE-MTART.
        PERFORM CHG_MTH.
        PERFORM CHG_MATNR.
        PERFORM CHG_MTART.
      ENDIF.
      IF P_MATNR NE I_EKBE-MATNR.
        PERFORM CHG_MTH.
        PERFORM CHG_MATNR.
      ENDIF.
      IF P_EBELN NE I_EKBE-EBELN.
        PERFORM CHG_MTH.
        PERFORM CHG_MATNR.
      ENDIF.
      IF PMTH NE CMTH.
        PERFORM CHG_MTH.
      ENDIF.
      IF I_EKBE-SHKZG = 'H'.
        I_EKBE-MENGE = I_EKBE-MENGE * -1.
        I_EKBE-DMBTR = I_EKBE-DMBTR * -1.
      ENDIF.
      IF I_EKBE-DMBTR NE 0.
        W_MENGE = W_MENGE + I_EKBE-MENGE.
        W_DMBTR = W_DMBTR + I_EKBE-DMBTR.
      ENDIF.
    ENDLOOP.
    PERFORM CHG_MTH.
    PERFORM CHG_MATNR.
    PERFORM CHG_MTART.
    PERFORM CHG_WERKS.
    TOP-OF-PAGE.
      WRITE:/ SY-DATUM,SY-UZEIT,
              77 'A M T E K   E N G I N E E R I N G   L T D',
              180 'Page', (4) SY-PAGNO.
      WRITE: / SY-REPID,
              77 '     Purchase Price Trending Report      ',
              180 SY-UNAME.
      write: /78 'From Date', S_BUDAT-LOW, 'To Date', S_BUDAT-HIGH.
      SKIP.
      WRITE: / 'SBU :', I_EKBE-WERKS,
               '     Material Type :', I_EKBE-MTART.
      SKIP.
      READ TABLE YMTH WITH KEY YYMM = '999901'.
      IF SY-SUBRC EQ 0.
        WRITE AT YMTH-COL ' APP Change'.
      ENDIF.
      WRITE: /01 'Part No',
              19 'PO No',
              31 'Curr'.
      LOOP AT YMTH.
        YMTH-COL = YMTH-COL + 3.
        IF YMTH-YYMM NE '999901'.
          WRITE AT YMTH-COL YMTH-YYMM(4).
          WRITE YMTH-MTH.
        ELSE.
          WRITE AT YMTH-COL '       %'.
        ENDIF.
      ENDLOOP.
      ULINE.
    *&      Form  get_ymth
          text
    -->  p1        text
    <--  p2        text
    FORM GET_YMTH.
      CMTH = S_BUDAT-HIGH(6).
      PMTH = S_BUDAT-LOW(6).
      IF S_BUDAT-HIGH IS INITIAL.
        CMTH = PMTH.
      ELSEIF S_BUDAT-LOW IS INITIAL.
        PMTH = CMTH.
      ENDIF.
      LMTH1 = CMTH.
      CDATE-YYMM = CMTH.
      SDATE = CDATE.
      SDATE = SDATE - 1.
      LMTH2 = SDATE(6).
      WHILE PMTH <= CMTH.
        MTH = CMTH+4(2).
        CDATE-YYMM = CMTH.
        YMTH-YYMM = CMTH.
        PERFORM GET_MTH.
        APPEND YMTH.
        SDATE = CDATE.
        SDATE = SDATE - 1.
        CMTH = sdate(6).
      ENDWHILE.
      YMTH-YYMM = '999901'.
      YMTH-MTH = ' % '.
      APPEND YMTH.
      SORT YMTH BY YYMM.
      W_COL = 21.
      LOOP AT YMTH.
        W_COL = W_COL + 15.
        YMTH-COL = W_COL.
        MODIFY YMTH.
      ENDLOOP.
      APPEND LINES OF YMTH TO S_YMTH.
      APPEND LINES OF YMTH TO W_YMTH.
      APPEND LINES OF YMTH TO G_YMTH.
      REFRESH YMTH.
      APPEND LINES OF S_YMTH TO YMTH.
    ENDFORM.                                                    " get_ymth
    *&      Form  get_mth
          text
    -->  p1        text
    <--  p2        text
    FORM GET_MTH.
      CASE MTH.
        WHEN '01'.
          YMTH-MTH = 'Jan'.
        WHEN '02'.
          YMTH-MTH = 'Feb'.
        WHEN '03'.
          YMTH-MTH = 'Mar'.
        WHEN '04'.
          YMTH-MTH = 'Apr'.
        WHEN '05'.
          YMTH-MTH = 'May'.
        WHEN '06'.
          YMTH-MTH = 'Jun'.
        WHEN '07'.
          YMTH-MTH = 'Jul'.
        WHEN '08'.
          YMTH-MTH = 'Aug'.
        WHEN '09'.
          YMTH-MTH = 'Sep'.
        WHEN '10'.
          YMTH-MTH = 'Oct'.
        WHEN '11'.
          YMTH-MTH = 'Nov'.
        WHEN '12'.
          YMTH-MTH = 'Dec'.
      ENDCASE.
    ENDFORM.                                                    " get_mth
    *&      Form  chg_matnr
          text
    -->  p1        text
    <--  p2        text
    FORM CHG_MATNR.
      CLEAR W_TOTAL.
      LOOP AT YMTH.
        W_TOTAL = W_TOTAL + YMTH-DMBTR.
      ENDLOOP.
      IF W_TOTAL = 0.
        EXIT.
      ENDIF.
      CLEAR: W_DMBTR, W_MENGE, W_DMBTR1, W_MENGE1, APP, APP1, APP2.
      READ TABLE YMTH WITH KEY YYMM = LMTH2.
      IF SY-SUBRC EQ 0 AND
         YMTH-MENGE NE 0.
        W_DMBTR = YMTH-DMBTR.
        W_MENGE = YMTH-MENGE.
        READ TABLE YMTH WITH KEY YYMM = LMTH1.
        IF SY-SUBRC EQ 0.
          APP = W_DMBTR / W_MENGE.
          APP1 = YMTH-DMBTR / YMTH-MENGE.
          APP2 = ( APP1 - APP ) / APP * 100.
        ENDIF.
      ENDIF.
      IF X_APP_L IS INITIAL AND
         X_APP_H IS INITIAL.
      ELSE.
        IF APP2 < X_APP_L OR
           APP2 > X_APP_H.
          EXIT.
          CLEAR: W_DMBTR, W_MENGE, APP.
          P_MATNR = I_EKBE-MATNR.
          P_EBELN = I_EKBE-EBELN.
          PERFORM CLR_YMTH.
        ENDIF.
      ENDIF.
      SKIP.
    WRITE:/ P_MATNR, ' Amount  ',
             'USD'.
    LOOP AT YMTH.
       WRITE AT YMTH-COL(12) YMTH-DMBTR NO-ZERO.
    ENDLOOP.
    WRITE:/(18) ' ', ' Quantity',
            P_MEINS.
    LOOP AT YMTH.
       WRITE AT YMTH-COL(12) YMTH-MENGE NO-ZERO.
    ENDLOOP.
      WRITE:/ P_MATNR(18), P_EBELN, 'USD' UNDER 'Curr'.
      LOOP AT YMTH.
        IF YMTH-YYMM NE '999901'.
          CLEAR APP.
          IF Ymth-menge ne 0.
            APP = YMTH-DMBTR / YMTH-MENGE.
          ENDIF.
          WRITE AT YMTH-COL(12) APP.
          READ TABLE S_YMTH WITH KEY YYMM = YMTH-YYMM.
          IF SY-SUBRC EQ 0.
            S_YMTH-MENGE = S_YMTH-MENGE + YMTH-MENGE.
            S_YMTH-DMBTR = S_YMTH-DMBTR + YMTH-DMBTR.
            MODIFY S_YMTH INDEX SY-TABIX.
          ENDIF.
          READ TABLE W_YMTH WITH KEY YYMM = YMTH-YYMM.
          IF SY-SUBRC EQ 0.
            W_YMTH-MENGE = W_YMTH-MENGE + YMTH-MENGE.
            W_YMTH-DMBTR = W_YMTH-DMBTR + YMTH-DMBTR.
            MODIFY W_YMTH INDEX SY-TABIX.
          ENDIF.
        ELSE.
          WRITE AT YMTH-COL(12) APP2.
        ENDIF.
      ENDLOOP.
      CLEAR: W_DMBTR, W_MENGE, APP.
      P_MATNR = I_EKBE-MATNR.
      P_EBELN = I_EKBE-EBELN.
      PERFORM CLR_YMTH.
    ENDFORM.                                                    " chg_matnr
    *&      Form  chg_mtart
          text
    -->  p1        text
    <--  p2        text
    FORM CHG_MTART.
      SKIP.
      ULINE.
      CONCATENATE P_MTART 'Total' INTO WTEXT SEPARATED BY SPACE.
      PERFORM PRN_TOT TABLES S_YMTH.
      P_MTART = I_EKBE-MTART.
      LOOP AT S_YMTH.
        CLEAR: S_YMTH-DMBTR, S_YMTH-MENGE.
        MODIFY S_YMTH.
      ENDLOOP.
    ENDFORM.                                                    " chg_mtart
    *&      Form  chg_werks
          text
    -->  p1        text
    <--  p2        text
    FORM CHG_WERKS.
      CONCATENATE P_WERKS 'Total' INTO WTEXT SEPARATED BY SPACE.
      PERFORM PRN_TOT TABLES W_YMTH.
      CLEAR: W_DMBTR, W_MENGE, APP.
      P_WERKS = I_EKBE-WERKS.
      LOOP AT W_YMTH.
        CLEAR: W_YMTH-DMBTR, W_YMTH-MENGE.
        MODIFY W_YMTH.
      ENDLOOP.
      NEW-PAGE.
    ENDFORM.                                                    " chg_werks
    *&      Form  chg_mth
          text
    -->  p1        text
    <--  p2        text
    FORM CHG_MTH.
      READ TABLE YMTH WITH KEY YYMM = PMTH.
      IF SY-SUBRC EQ 0.
        YMTH-MENGE = W_MENGE.
        YMTH-DMBTR = W_DMBTR.
        MODIFY YMTH INDEX SY-TABIX.
      ENDIF.
      CLEAR: W_MENGE, W_DMBTR.
      PMTH = CMTH.
    ENDFORM.                                                    " chg_mth
    *&      Form  clr_ymth
          text
    -->  p1        text
    <--  p2        text
    FORM CLR_YMTH.
      LOOP AT YMTH.
        CLEAR: YMTH-DMBTR, YMTH-MENGE.
        MODIFY YMTH.
      ENDLOOP.
    ENDFORM.                                                    " clr_ymth
    *&      Form  prn_tot
          text
    -->  p1        text
    <--  p2        text
    FORM PRN_TOT TABLES I_YMTH STRUCTURE YMTH.
      CLEAR: W_DMBTR, W_MENGE, W_DMBTR1, W_MENGE1, APP, APP1, APP2.
      READ TABLE I_YMTH WITH KEY YYMM = LMTH2.
      IF SY-SUBRC EQ 0 AND
         I_YMTH-MENGE NE 0.
        W_DMBTR = I_YMTH-DMBTR.
        W_MENGE = I_YMTH-MENGE.
        READ TABLE I_YMTH WITH KEY YYMM = LMTH1.
        IF SY-SUBRC EQ 0.
          APP  = W_DMBTR / W_MENGE.
          APP1 = I_YMTH-DMBTR / I_YMTH-MENGE.
          APP2 = ( APP1 - APP ) / APP * 100.
        ENDIF.
      ENDIF.
    WRITE:/ WTEXT, ' Amount  ',
             'USD'.
      LOOP AT I_YMTH.
        SELECT SINGLE * FROM TCURR
          WHERE FCURR = 'SGD'
          AND   TCURR = 'USD'.
          I_YMTH-DMBTR = I_YMTH-DMBTR * TCURR-UKURS.
       WRITE AT I_YMTH-COL(12) I_YMTH-DMBTR NO-ZERO.
      ENDLOOP.
    WRITE:/(18) ' ', ' Quantity'.
    LOOP AT I_YMTH.
       WRITE AT I_YMTH-COL(12) I_YMTH-MENGE NO-ZERO.
    ENDLOOP.
      WRITE:/(18) ' ', ' APP     ', 'USD'.
      LOOP AT I_YMTH.
        IF I_YMTH-YYMM NE '999901'.
          CLEAR APP.
          IF I_YMTH-MENGE NE 0.
            APP = I_YMTH-DMBTR / I_YMTH-MENGE.
          ENDIF.
          WRITE AT I_YMTH-COL(12) APP.
        ELSE.
          WRITE AT I_YMTH-COL(12) APP2.
        ENDIF.
      ENDLOOP.
      ULINE.
      CLEAR: W_DMBTR, W_MENGE, APP.
    ENDFORM.                    " prn_tot

  • Adding an extra field in customer statement report

    Dear all,
    We are on SAP B1 2007 PL42. How can we add an extra field eg a UDF on a customer statement in PLD? The system's customer statement have all fields as "free Text".
    Kind Regards,
    Asif

    Hi,
    I have created a free text field in PLD- named Field_101. I have also created a database field from the OINV table and referenced to the UDF "U_FileNo" named Field_102.  On field_101 I have linked to Field_102 but on previewing the report the field is empty/blank.
    Thanks
    Asif

  • Adding one more field to the VL06O report

    Hi everybody
       When  u execute the TR code VL06O a screen will appear from that screen select list outbound deliveries and then provide some date and execute.
    The output will come having fields delivery,ship-to-party,name of ship-to-party like that 7 fields are there and now i want to see one more field called shipment number in the output along with the previuos 7 fields.
    what should i do it is a standard program?
    please guide me?

    Hello.
    See note 128150 to more details.
    There are user exists to add new fields (user fields).
    Regards.

  • Adding Additional field "Supplier name" & "Supplier No" in MB5B Report?

    Can i add the above stated two additional fields in the standard report of MB5b, is there any implicit enhancement in the standard report which can help achieve my objective?

    Hi,
    The possibility to include additional fields in the report MB5B is       
    limited to MSEG, just as you can see in the text of the                  
    report RM07MLBD_CUST_FIELDS itself:                                                                               
    This include contains the structure for additional fields for report 
    RM07MLBD ( transaction MB5B )                                                                               
    the following fields are not shown in the list of report             
    RM07MLBD                                                             
    If you want to insert some of these fields in the list of the        
    hidden fields delete the '*' in the type definition.                 
    >>* There are only fields from database table MSEG possible <<<<<<<<<<<  
    Please use only the following fields, because these fields           
    are considered during the creation of the field catalog;             
    plaese consider, that each active field will cost performance                                                                               
    If you need to add aditional information from other tables, like the     
    Reference Document Number you will need to  build your own query.    
    Regards,
    Mauro

  • View Customer number field in the FBL3N report

    Hi All,
    Is it possible to view the Customer Number Field in the FBL3N report??
    Please revert asap.
    Rgds,
    Kunal Vichare
    Moderator: Please, search SDN

    Hello
    Please find the process for adding additional field in FBL3N
    SPRO->FA->GLA->GL->Line Item->Display line item with ALV->Define Special Fields for finding and sort data
    Added the additional field for Customer account number.
    Table   Field name   Field lable
    BSEG   KUNNR         Customer
    Thanks
    Kameshwar Rao

  • Adding a new field in a standard ALV reort

    HI,
    I have a requirement of adding a new field to Standard ALV report. The TCODE is CN50N. When you execute it and gives the project as input it will display an ALV report. i want to add another filed to that ALV report. The program it 's using is RPSISKB000. How to do it???
    regards
    sandeep

    Hi,
         Check in the ALV output whether these fields are already there and not displaying in the ALV output, if the fields are not at all printing in the ALV output,then copy the Program to Z program and change it.
    write the Code to add the new fields to the internal table and change the Field catalaog to come your fields in the ALV output then print it
    Regards

  • How To Add Additional Fields When Creating New Contact From w/in Mac Mail?

    Hi there. When in Mac Mail and clicking on contact information provided within an email, we are able to either (1) CREATE NEW CONTACT or (2) ADD TO EXISTING CONTACT (by clicking on the arrow next to a phone number, address, etc.). If I choose "Create New Contact," how can I add additional fields BEFORE clicking on "Add to Address Book" button in lower right corner? Let's say, for example, I know this new contacts URL or company. (Currently, I am creating the new contact from within Mac Mail and then going to Address Book and finding the contact, then editing, the adding the additional fields, then saving, and then going back to Mac Mail. This all takes time.)
    Note: When creating a new iCal event from within Mac Mail, we can click on Option/Alt key when selecting drop-down arrow...and this will allow us to add additional information. The same feature isn't available for address book???

    I have the exact same question and problem. If there was a way to automatically open the AB entry after "creating new contact" this would solve it.
    Thanks for any suggestion

  • Additional field in infoset as string

    Hi,
    Is it possible to add an additional field in an Infoset with type string?
    When i'm creating it, I need to fill the definition of the field, with a certain type or with reference to some table field, but I'm not finding any suitable to here of type string. I always get an error "you must use a flat structure" or "you cannot use internal tables, strings, references, or structures as components".
    This means I cannot create an additional field as a string?
    Thanks in advance for your help.
    Best regards,
    Sónia Gonçalves

    Thnks for answers ,
    I have just do that but there is no hided field . I haven't see the additional field  there already.
    I think it 'll more clear if  I tell about what am I doing step by step ;
    First , I created infoset in SQ01 with joinig tables LIKP -  LIPS .Then I added some additional field ; I collect different value from another table . Then I create field group called " ADD" in infoset and assigned additional fields that I created to "ADD " . Finally generate and saved infoset .
    Second , in RSO2 I create data source and joined with infoset . Then comes to selection filed screen .  Here was my problem ; there were no field that I added to infoset ,additional fields didn't appear
    Can I  explain it ?
    Thnks for help ..

  • Additional field in IT0109

    Hi All,
    I have added an additional field in IT0109 through PM01.
    But the field is not displaying in PA30, while using infotype 0016.I have created an entry in table T582C for mp001600 and zp010900.
    Please let me know what could be the problem.
    Thanks,
    Bindu.

    Hi,
    You have modified IT0109 and trying to see the data in IT0016. Please check IT0109.
    Sandip

  • Adhoc query -sq02- Additional fields

    HI experts
    I am working additional fields in SQ02 .
    I added a additional field for an infotype in SQ02  .Issue when I go to Tcode PQAH and run the query .I Could not able to see the selections check box for my additional fields which is useful to select as input field .
    And when I right click on my additional field I could see  options 'Only value'  but for other fields I could see ' only value ' , 'only text' and ' value and text' .
    If any one worked on these kind of issues .Please give pointers .and requirement is specific.

    Hi Kamesh,
    I have the same issue - did you resolve this issue, and please could you share how?
    Thanks,
    Vaishali

  • Changing additional field in FI line item

    Hi,
    I have added a additional field for FI line item,
    how could i change it in FB02, or FBL3N,etc
    Is there are any user exit/ screen enhancement?
    or it can be done by config?
    or i have to mod it?
    thx a lot
    John

    Hi
    You have to add Purchase Document (PO) as a special field in the line layout variant through  customizing  to view PO in the FBL3N Line layout,
    Go to SPRO Settings - **** - GL Accounting - GL Accounts - Master Records - Line Items - Line Item Display - Define Special fields for finding and sorting data"
    A message will be displayed that it is a cross client change. Presse nter
    Before adding the special field PO, the line layout variant does not have the field PO
    Click on New Entries button
    Give the Table as BSEG and Field as EBELN.
    And save.
    Assign points if useful.
    thanks
    radhika

  • How to make SAP Query additional field as one of the selection field ?

    Hi experts,
    I'm working on a AdHoc query. I added some Additional fields to the infoset. I put Abap code to populate this additional fields as output fields but I want to make these fields as selection fields also.
    How can I accomplish this ?
    I'd appreciate any answer or suggestion.
    Thanks in advance.

    See Extended / Quick Search capability with attributes in the following SAP notes.
    [482338 - Using Extended Search in ISA B2B, ver. 30|https://service.sap.com/sap/support/notes/482338]
    [792556 - Quick search using several attributes|https://service.sap.com/sap/support/notes/792556]
    [888528 - ISA R/3 4.0: Extended catalog search not consistent|https://service.sap.com/sap/support/notes/888258]

Maybe you are looking for

  • Getting a error while creating a product

    hi I am getting a error "please check the user set up" while creating and updating a product in iStore Administrator. System Admin user is able to create a product and also to update.Even assigned the all the roles and enrollments as such as for syst

  • Please add indicator LED light for the HDD and sleep back, add some system hotkey

    After Lenovo have announced  the new T440 T540,we were shocked by the graphic card: GT720m (game card) and no indicator LED for HDD. At last we need a NVS graphic card to do some grophic related work or mobile business. So we waited for the new w540,

  • Maximum users for mail server

    HI I just wanted to see how many users people had on their systems.. i am looking a the 2-quad core xserve, with 16gb ram 3 15,000 rpm disks in raid 5. I currently have 700 users but and i want this server to last until i at least double the users ca

  • Creative Cloud Student and Teacher Edition

    Purchased this yesterday.  It states that you can download onto two computers.  I have it downloaded on one computer, but it is not working now.  It won't let me download it on the second computer.  Can anyone help?

  • Rendering vs. Data integration, cons and pros?

    Hi, I I'm trying to figure out what are the advantages to render pdf and not to use data integration service, the list I have so far: render to HTML, SWF. render based on fragments server side form scripts ? (not sure ) In case that those advantages