Regarding report(urgent)

Hi experts,
i need to add some fields to output of the report.
here i am giving the fields required to add and giving the code below please build the code
, we need to add the following data in the report output.
    > GR Document (RSEG-LFBNR)
    > GR date (MKPF-BLDAT)
    > Quantity (MSEG-ERFMG)
    > Amount in LC(MSEG-DMBTR)
    > GL Account (MSEG-SAKTO)
Logic in getting the record:
    > for each invoice no(RESG-BELNR) of a PO Line(EKKO-EBELN,EKPO-EBELP), get GR no (RSEG-LFBNR) and doc. year(RSEG-LFGJA),  
    > select the matching record in MSEG using the GR no and year  (RSEG-LFBNR = MKPF-MBLNR & RSEG-LFGJA=MKPF-MJAHR,                                                                               
EKKO-EBELN=RSEG- EBELN,EKPO-EBELP=RSEG-EBELP)
    > select the matching record in MKPF using the GR no and year (RSEG-LFBNR = MKPF-MBLNR & RSEG-LFGJA=MKPF-MJAHR)
here iam giving my code  we have to add thos fields into this code:
TABLES: ekko,   "Purchasing Document Header
        ekpo,   "Purchasing Document Item
        rbkp.   "Document Header: Invoice Receipt
Type-Pools
TYPE-POOLS : slis.   " Has to be declared to use ALVs
To hold ALV field catgory data
DATA : it_fieldcat TYPE slis_t_fieldcat_alv,
       wa_fieldcat LIKE LINE OF it_fieldcat.
Internal tables declarations
Internal table to hold Report data
DATA: BEGIN OF it_output OCCURS 0,
       dir_indir(9),
       bukrs LIKE ekko-bukrs,    "company code
       ebeln LIKE ekko-ebeln,    "Purchasing Document Number
       ebelp LIKE ekpo-ebelp,    "Item
       aedat LIKE ekko-aedat,    "Date on which the record was created
       belnr LIKE rseg-belnr,    "Accounting document number
       bldat LIKE rbkp-bldat,    "Document date in document
       budat LIKE rbkp-budat,    "Posting date in the document
       wrbtr LIKE rseg-wrbtr,    "Amount in document currency
       curr  LIKE t880-curr,     "Price unit (Local Curr)
       bednr LIKE ekpo-bednr,    "Requirement tracking number
       lifnr LIKE ekko-lifnr,    "Vendor's account number
       name1 LIKE lfa1-name1,                               "name1
       name2(30),                "preparer name
       name3(30),                "requester name
       gjahr LIKE rseg-gjahr,    "Fiscal year
       ernam LIKE ekko-ernam,    "Name of Person who Created the Object
       kursf LIKE rbkp-kursf,    "Exchange rate
       shkzg LIKE rseg-shkzg,    "Debit/credit indicator
       banfn LIKE ekpo-banfn,    "Purchase requisition number
        bnfpo like eban-bnfpo,
       knttp LIKE ekpo-knttp,    "account assignment category
      END OF it_output.
Selection Screen
SELECTION-SCREEN: BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
PARAMETERS: p_bukrs LIKE ekko-bukrs OBLIGATORY.
Parameters: P_knttp like ekpo-knttp as checkbox default 'X'.
SELECT-OPTIONS: s_invdat FOR rbkp-bldat,    "Document date in document
                s_vendor FOR ekko-lifnr,    "Vendor's account number
                s_purcdo FOR ekko-ebeln,    "Purchasing Document no
                s_credat FOR ekko-aedat OBLIGATORY,"create date
                s_plant  FOR ekpo-werks,    "Plant
                s_doctyp FOR ekko-bsart,    "Purchasing document type
                s_purorg FOR ekko-ekorg,    "Purchasing organization
                s_trcnum FOR ekpo-bednr,    "Requirement tracking number
                s_knttp  FOR ekpo-knttp.    "account assignment category
SELECTION-SCREEN: END OF BLOCK b1.
DATA: count TYPE i VALUE 0.            " Used to count records
          INITIALIZATION                                             *
INITIALIZATION.
At Selection Screen
AT SELECTION-SCREEN.
Checking for the input values of selection screen fields.
  PERFORM validate_params.
Start Of Selection
START-OF-SELECTION.
if p_knttp = 'X'.
PERFORM get_data.
else.
skip.
*message e021 with 'no output'.
endif.
  PERFORM get_data.
End Of Selection
END-OF-SELECTION.
SUBROUTINE TO CALL THE FUNCTION MERGE TO ENSURE PROPER DISPLAY.
  PERFORM merge_fieldcatalog.
  PERFORM modify_fieldcat.
  PERFORM alv_report.
      FORM validate_params                                          *
FORM validate_params.
Validate company code
  SELECT SINGLE COUNT(*) FROM t001 WHERE bukrs = p_bukrs.
  IF sy-subrc <> 0.
    MESSAGE e021 WITH 'Please enter a valid Company code'.
  ENDIF.
*Validate Vendor.
  SELECT SINGLE COUNT(*) FROM lfa1 WHERE lifnr IN s_vendor.
  CASE sy-subrc.
    WHEN 0.
    WHEN OTHERS.
      MESSAGE e021 WITH 'Please enter a valid Vendor'.
  ENDCASE.
*Validate PO doc type
  SELECT SINGLE COUNT(*) FROM t161 WHERE bsart IN s_doctyp.
  CASE sy-subrc.
    WHEN 0.
    WHEN OTHERS.
      MESSAGE e021 WITH 'Please enter a valid PO Doc. Type'.
  ENDCASE.
*Validate plant
  SELECT SINGLE COUNT(*) FROM t001w WHERE werks IN s_plant.
  CASE sy-subrc.
    WHEN 0.
    WHEN OTHERS.
      MESSAGE e021 WITH 'Please enter a valid Plant. Type'.
  ENDCASE.
*Validate Purch. Org
  SELECT SINGLE COUNT(*) FROM t024e WHERE ekorg IN s_purorg.
  CASE sy-subrc.
    WHEN 0.
    WHEN OTHERS.
      MESSAGE e021 WITH 'Please enter a valid Purch. Org.'.
  ENDCASE.
ENDFORM.                               " PERFORM VALIDATE_PARAMS.
      FORM get_data                                                 *
FORM get_data.
  DATA: l_persnumber LIKE usr21-persnumber.
Get PO data
  SELECT a~bukrs a~ebeln b~ebelp a~aedat a~lifnr a~ernam
         b~knttp b~bednr b~banfn
         c~belnr c~wrbtr c~gjahr c~shkzg
         d~bldat d~budat d~kursf
         e~dir_indir
  INTO CORRESPONDING FIELDS OF TABLE it_output
  FROM ekko AS a
  JOIN ekpo AS b ON b~ebeln = a~ebeln
  JOIN rseg AS c ON c~ebeln = b~ebeln
                AND c~ebelp = b~ebelp
                AND c~bukrs = a~bukrs
  JOIN rbkp AS d ON d~belnr = c~belnr
                AND d~gjahr = c~gjahr
  LEFT JOIN zpo_dirindir AS e ON e~knttp = b~knttp
  WHERE a~bukrs = p_bukrs
    AND a~lifnr IN s_vendor
    AND a~ebeln IN s_purcdo
    AND a~bsart IN s_doctyp
    AND a~ekorg IN s_purorg
    AND a~aedat IN s_credat
    AND b~knttp IN s_knttp
    AND b~werks IN s_plant
    AND b~bednr IN s_trcnum.
  LOOP AT it_output.
  Get posting date, Doc. date & Curr. Key
    IF it_output-kursf > 0.
      it_output-wrbtr = it_output-wrbtr * it_output-kursf.
      else.
      if it_output-kursf < 0.
     it_output-wrbtr =   it_output-Wrbtr * ( 1 / it_output-kursf ).
       it_output-wrbtr = abs( it_output-wrbtr ).
      endif.
    ENDIF.
  get local currency
    SELECT SINGLE waers INTO it_output-curr FROM t001
             WHERE bukrs = it_output-bukrs.
  Get vendor name.
    SELECT SINGLE name1 FROM lfa1 INTO it_output-name1
    WHERE lifnr = it_output-lifnr.
  Get PO created person name
    SELECT SINGLE persnumber INTO l_persnumber FROM usr21
     WHERE bname = it_output-ernam.
    IF sy-subrc = 0.
      SELECT SINGLE name_text FROM adrp INTO it_output-name2
       WHERE persnumber = l_persnumber.
   ELSE.
      it_output-name2 = it_output-ernam.
    ENDIF.
  Get get requested by from Unloading point in PO
  else PR created by (If PR exists)
    CASE it_output-dir_indir.
      WHEN 'I'.
      Take requested by from Unloading point.
        SELECT SINGLE ablad INTO it_output-name3 FROM ekkn
         WHERE ebeln = it_output-ebeln
           AND ebelp = it_output-ebelp .
      WHEN 'D'.
       SELECT SINGLE ernam INTO it_output-name3 FROM eban
        WHERE banfn = it_output-banfn
                 AND ebelp = it_output-ebelp.
       IF sy-subrc <> 0.
         MOVE it_output-ernam TO it_output-name3.
       ENDIF.
       SELECT SINGLE persnumber INTO l_persnumber FROM usr21
           WHERE bname = it_output-name3.
       IF sy-subrc = 0.
         SELECT SINGLE name_text FROM adrp INTO it_output-name3
          WHERE persnumber = l_persnumber.
       ENDIF.
select single ernam into  it_output-name3 from eban where
     banfn = it_output-banfn and bnfpo = it_output-bnfpo.
             move it_output-name3 to it_output-name3.
            if sy-subrc = 0.
        SELECT SINGLE PERSNUMBER INTO L_PERSNUMBER FROM USR21
            WHERE BNAME = it_output-name3.
        IF SY-SUBRC = 0.
          SELECT SINGLE NAME_TEXT FROM ADRP INTO it_output-name3
           WHERE PERSNUMBER = L_PERSNUMBER.
        ELSE.          it_output-name3 = it_output-name3.
        endif.
      else.
        SELECT SINGLE PERSNUMBER INTO L_PERSNUMBER FROM USR21
                WHERE BNAME = it_output-ernam.
        IF SY-SUBRC = 0.
          SELECT SINGLE NAME_TEXT FROM ADRP INTO it_output-name3
           WHERE PERSNUMBER = L_PERSNUMBER.
        ELSE.
          it_output-name3 = it_output-ernam.
        endif.
      endif.
    ENDCASE.
  translate direction indicator to Indirect or Direct
    CASE it_output-dir_indir.
      WHEN 'I'. it_output-dir_indir = 'Indirect'.
      WHEN 'D'. it_output-dir_indir = 'Direct'.
    ENDCASE.
    MODIFY it_output.
  ENDLOOP.
ENDFORM.
FORM MERGE_FIELDCATALOG                                             *
FORM merge_fieldcatalog.
  CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
       EXPORTING
            i_program_name         = sy-cprog
            i_internal_tabname     = 'IT_OUTPUT'
            i_inclname             = sy-cprog
       CHANGING
            ct_fieldcat            = it_fieldcat[]
       EXCEPTIONS
            inconsistent_interface = 1
            program_error          = 2
            OTHERS                 = 3.
ENDFORM. " MERGE_FIELDCATALOG
      FORM modify_fieldcat                                          *
FORM modify_fieldcat.
  DATA: wa_fieldcat TYPE slis_fieldcat_alv.
  LOOP AT it_fieldcat INTO wa_fieldcat.
    CASE wa_fieldcat-fieldname.
      WHEN 'DIR_INDIR'.
        wa_fieldcat-seltext_m = 'Direct/Indirect'.
      WHEN 'NAME2'.
        wa_fieldcat-seltext_m = 'PREPARER NAME'.
      WHEN 'NAME3'.
        wa_fieldcat-seltext_m = 'REQUESTER NAME'.
      WHEN 'BEDNR'.
        wa_fieldcat-seltext_m = 'SSP PO'.
      WHEN 'AEDAT'.
        wa_fieldcat-seltext_m = 'PO DOCUMENT DATE'.
      WHEN 'BLDAT'.
        wa_fieldcat-seltext_m = 'INVOICE DOCU DATE'.
      WHEN 'BUDAT'.
        wa_fieldcat-seltext_m = 'POSTAGE DATE'.
      WHEN 'WRBTR'.
        wa_fieldcat-seltext_m = 'LOCAL AMOUNT'.
        wa_fieldcat-cfieldname = 'CURR'.
        wa_fieldcat-ctabname   =  wa_fieldcat-tabname.
      WHEN 'CURR'.
        wa_fieldcat-seltext_m = 'LOCAL CURR'.
      WHEN 'NAME1'.
        wa_fieldcat-seltext_m = 'VENDOR NAME'.
    ENDCASE.
    MODIFY it_fieldcat FROM wa_fieldcat.
  ENDLOOP.
ENDFORM.
      FORM ALV_REPORT                                               *
FORM alv_report.
  CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
       EXPORTING
            i_callback_program = sy-cprog
            it_fieldcat        = it_fieldcat[]
       TABLES
            t_outtab           = it_output[].
  IF sy-subrc <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
  ENDIF.

Very sorry to say this Venu ...
This is a forum to ask doubts .. "Not get your work done for Free"
Kindly try to do it yourself first & then if you are stuck somewhere fell free to shout for help
Best regards,
Gaurav

Similar Messages

  • Hi regarding Reports

    Hi , i need urgent information regarding reports,
    i developed one ALV report, i want to schedule in background ,daily executes on morning 8 AM, generate file in XLS format with the reported data (background scheduled report) , that Data will will be sotred in Appilcation server perminently, after some days, generate report with that data ie data in Appilcation server.
    kindly send to me the sample code

    Hello Chintam Nagaraju,
    Pl. follow the steps:
    Assuming that you moved this report in production environment. In the program itself you can give the logic for downloading the data in XLS format on particular target system (take help from sr technical guy)
    1. Go to SM36 transaction for batch job schedule.
    2. Give the job name, priority and target system name in initial inputs
    3. Click on Start Condition Button
    4. Click on Date/time and maintain start time and data (say 8.00 AM)
    5. Select the periodic indicator on the bottom of screen and maintain periodic value (as daily)
    and save this batch job.
    Hope this will help.
    Regards
    Arif Mansuri.
    Reward if answer is helpful.

  • Regarding report painter/writer

    I have a problem regarding REPORT WRITER AND REPORT PAINTER. I have to develop a report based on transaction -
    CK13 in report painter. I am new to this area of reporting. How could I insert new tables in the library as I do not find a table or structure based on this transaction where I can find activity type, quantity and value in object currency.
    Report format  -
    Material      Activity type  Vvalue in object currency.

    Hi,
    Try standard reports in GRR3 with library 7*. Relevant tables/structure could be KKBE, KKBC, & KKBU. Copy and modify the same.
    Rgds.

  • Urgent:Regarding Reports for read only field.

    Hi All,
    Does it happen that the fields which are read only or system defined does not get reflected in report subject area or so ? I have created one report where one field 'Triage' which is Look up window and Picklist read only field is not showing up values in report subject area.Is this due to the field which is a Picklist read only field.
    Quick response will be highly appreciated!!
    Thanks and Regards,
    Manish.

    user12880720 wrote:
    Hi All,
    Does it happen that the fields which are read only or system defined does not get reflected in report subject area or so ? I have created one report where one field 'Triage' which is Look up window and Picklist read only field is not showing up values in report subject area.Is this due to the field which is a Picklist read only field.
    Quick response will be highly appreciated!!
    Thanks and Regards,
    Manish.Hi Manish,
    You do not specific if this is a multiselect picklist you are refering to or what type of reporting you are trying real-time or analytics?
    Anyway please see the below from the help file:
    Multiselect Picklists
    Multiselect picklist (MSPs) values are not supported in real-time reporting subject areas. They are supported in the historical subject areas for the following subject areas:
    Account
    Activity
    Contact
    Dealer
    Lead
    Opportunity
    Service Request

  • Please help me regarding report  below which already doen't working..Urgent

    tables:
    t179,t179t,vbap,S001,MVKE.
    data: begin of i_stufe occurs 100,
          stufe like t179-stufe,
          digit(2) ,
          end of i_stufe.
    data: begin of i_stufe1 occurs 100,
          stufe like t179-stufe,
          digit(2) ,
          end of i_stufe1.
    data: begin of i_stufe2 occurs 100,
          stufe like t179-stufe,
          digit(2) ,
          end of i_stufe2.
    data: begin of i_svy occurs 100,
          svy like t179-stufe,
          end of i_svy.
    data: b(3).
    i_svy-svy = 1.
    APPEND i_svy.
    data:v_n type i,
          v_n1 type i,
          v_prodh like t179-prodh,
          v_digit type i.
    data i_repid like sy-repid.
    data i_lines like sy-tabix.
    Data for ALV display ************************
    TYPE-POOLS slis.
    DATA : ls_slis_layo TYPE slis_layout_alv,
             lt_slis_fcat TYPE slis_t_fieldcat_alv ,
             it_sort TYPE slis_t_sortinfo_alv,
             ls_sort TYPE slis_sortinfo_alv.
    DATA : wa_slis_fcat TYPE slis_fieldcat_alv.
    DATA : alvfcwa TYPE slis_fieldcat_alv.
    DATA: begin of itab occurs 0 ,
    vkorg like s001-vkorg,
    vtweg like s001-vtweg,
    spart like s001-spart,
    kunnr like s001-kunnr,
    matnr like s001-matnr,
    prodh like t179-prodh,
    vtext like t179t-vtext,
    select type c ,
    p1 LIKE prodh-zzprodh1,
      t1 LIKE t179t-vtext,
      p2 LIKE prodh-zzprodh2,
      t2 LIKE t179t-vtext,
      p3 LIKE prodh-zzprodh3,
      t3 LIKE t179t-vtext,
      p4 LIKE prodh-zzprodh4,
      t4 LIKE t179t-vtext,
      p5 LIKE prodh-zzprodh5,
      t5 LIKE t179t-vtext,
      p6 LIKE prodh-zzprodh6,
      t6 LIKE t179t-vtext,
      p7 LIKE prodh-zzprodh7,
      t7 LIKE t179t-vtext,
      p8 LIKE prodh-zzprodh8,
      t8 LIKE t179t-vtext,
      p9 LIKE prodh-zzprodh9,
      t9 LIKE t179t-vtext,
      p like t179-prodh,
    END OF itab.
    data : begin of gt_prodh occurs 0 .
            include structure mvke.
    data: end of gt_prodh .
    DATA:X(1),
          p(20),
          t(20),
          y(1),
          v_hier(20).
    DATA:v_digiteski(2).
    v_digiteski = 0.
    data:check(1).
    DATA: BEGIN OF gt_t179 OCCURS 0,
        stufe LIKE t179-stufe,
        prodh LIKE t179-prodh,
      END OF gt_t179.
    DATA: v_max TYPE i.
    selection-screen  begin of block  part1 with frame title text-001.
    select-options:  s_vkorg for s001-vkorg,
                   s_vtweg for s001-vtweg,
                   s_spart for s001-spart,
                   s_kunnr for s001-kunnr,
                   s_matnr for s001-matnr.
    selection-screen end of block  part1 .
    select-options:spart for vbap-spart.
    concatenate spart-low '*' into b.
    ranges vprodh for t179-prodh.
    vprodh-sign = 'I'.
    vprodh-option = 'CP'.
    vprodh-low = b.
    append vprodh .
    clear vprodh.
    start-of-selection.
    read data into table imat
      do 9 times.
        SELECT SINGLE prodh FROM t179 INTO v_prodh
        WHERE STUFE EQ i_svy-svy.
        IF sy-SUBRC = 0.
          IF STRLEN( v_prodh ) LE 18.
            i_stufe-stufe = i_svy-svy.
            i_stufe1-stufe = i_svy-svy.
            i_stufe1-digit = STRLEN( v_prodh ).
            i_stufe-digit = STRLEN( v_prodh ) - v_digit.
            v_digit = STRLEN( v_prodh ).
            APPEND i_stufe.
            CLEAR i_stufe.
            APPEND i_stufe1.
            CLEAR i_stufe1.
            APPEND i_stufe2.
            CLEAR i_stufe2.
          ENDIF.
        ELSE.
          EXIT.
        ENDIF.
        i_svy-svy = i_svy-svy + 1.
        APPEND i_svy.
      enddo.
      SORT i_stufe DESCENDING BY stufe.
      LOOP AT i_stufe.
        v_max = i_stufe-stufe.
        EXIT.
      ENDLOOP.
      SELECT * FROM t179 INTO CORRESPONDING FIELDS OF TABLE gt_t179
      where prodh eq v_prodh.
      select * from s001 into corresponding fields of itab where matnr
    in s_matnr.
        select single vkorg vtweg prodh from mvke into corresponding
        fields of itab where matnr = s_matnr
        and vtweg in s_vtweg
        and vkorg in s_vkorg.
        select single vtext from t179t into corresponding fields of itab
        where prodh = itab-prodh .
        append itab.
        clear itab.
      endselect.
      SORT i_stufe2 DESCENDING BY stufe.
      LOOP at i_stufe2.
        LOOP AT gt_t179 WHERE stufe = v_max.
          clear check.
          PERFORM kontrol using gt_t179-prodh.
          CLEAR  i_stufe1-digit.
          LOOP AT i_stufe1.
            if check = 'X'.
              exit.
            endif.
            do 1 times.
              read table i_stufe into i_stufe
               with key stufe = i_stufe1-stufe.
              if i_stufe-stufe > v_max.
                exit.
              endif.
              SELECT SINGLE vtext FROM T179T INTO v_hier
              WHERE spras = sy-langu
              AND prodh = gt_t179-prodh(i_stufe1-digit).
              FIELD-SYMBOLS  = v_hier.
              itab-p = gt_t179-prodh.
              v_digiteski = i_stufe1-digit.
              CLEAR p.
              CLEAR t.
            enddo.
         ENDLOOP.
          ENDLOOP.
          CLEAR v_digiteski.
          if itab-p1 ne space.
            APPEND itab.
          endif.
          CLEAR itab.
          CLEAR .
        ENDLOOP.
        v_max = v_max - 1.
        if v_max = 0.
          exit.
        endif.
      ENDLOOP.
      data:BEGIN OF i_tt179 OCCURS 100,
        stufe like t179-stufe,
        prodh like t179-prodh,
        end of i_tt179.
    *&      Form  kontrol
          text
         -->X          text
    form kontrol using x.
      data: a(18).
      CONCATENATE X '*' into a.
      ranges prodh for t179-prodh.
      prodh-sign = 'I'.
      prodh-option = 'CP'.
      prodh-low = a.
      append prodh . clear prodh.
      prodh-sign = 'E'.
      prodh-option = 'EQ'.
      prodh-low = X.
      append prodh . clear prodh.
      select * FROM t179
         into CORRESPONDING FIELDS OF TABLE i_tt179 WHERE prodh in prodh.
      if sy-SUBRC eq 0.
        check = 'X'.
      endif.
    ENDFORM.                    "kontrol
    Check if material was found
    " clear i_lines.
    "  describe table result lines i_lines.
    "  if i_lines lt 1.
    "*   Using hardcoded write here for easy upload
    "    write: /
    "    'No materials found.'.
    "    exit.
    "  endif.
    end-of-selection.
      CLEAR ls_slis_layo.
      ls_slis_layo-colwidth_optimize = 'X'.
      ls_slis_layo-max_linesize      = 1023.
      ls_slis_layo-get_selinfos      = 'X'.
      ls_slis_layo-detail_popup      = 'X'.
      CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
         EXPORTING
          i_program_name               = sy-repid
          i_internal_tabname           = 'ITAB'
        i_structure_name           = 'ZSKAR_ANZ'
        i_client_never_display       = 'X'
            i_inclname                   = sy-repid
            i_bypassing_buffer           = 'X'
        I_BUFFER_ACTIVE              =
          CHANGING
            ct_fieldcat                  = lt_slis_fcat[]
      EXCEPTIONS
         inconsistent_interface       = 1
         program_error                = 2
         OTHERS                       = 3
      CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
       EXPORTING
      I_INTERFACE_CHECK                 = ' '
         i_bypassing_buffer                = 'X'
      I_BUFFER_ACTIVE                   = ' '
         i_callback_program                = sy-repid
      I_CALLBACK_PF_STATUS_SET          = ' '
      I_CALLBACK_USER_COMMAND           = ' '
      I_CALLBACK_TOP_OF_PAGE            = ' '
      I_CALLBACK_HTML_TOP_OF_PAGE       = ' '
      I_CALLBACK_HTML_END_OF_LIST       = ' '
      I_STRUCTURE_NAME                  = 'itab'
      I_BACKGROUND_ID                   = ' '
      I_GRID_TITLE                      =
      I_GRID_SETTINGS                   =
         is_layout                         = ls_slis_layo
         it_fieldcat                       = lt_slis_fcat
      IT_EXCLUDING                      =
      IT_SPECIAL_GROUPS                 =
    IT_SORT                           = it_sort
      IT_FILTER                         =
      IS_SEL_HIDE                       =
      I_DEFAULT                         = 'X'
      I_SAVE                            = ' '
      IS_VARIANT                        =
      IT_EVENTS                         =
      IT_EVENT_EXIT                     =
      IS_PRINT                          =
      IS_REPREP_ID                      =
      I_SCREEN_START_COLUMN             = 0
      I_SCREEN_START_LINE               = 0
    I_SCREEN_END_COLUMN               = 160
    I_SCREEN_END_LINE                 = 5
      I_HTML_HEIGHT_TOP                 = 0
      I_HTML_HEIGHT_END                 = 0
      IT_ALV_GRAPHICS                   =
      IT_HYPERLINK                      =
      IT_ADD_FIELDCAT                   =
      IT_EXCEPT_QINFO                   =
      IR_SALV_FULLSCREEN_ADAPTER        =
    IMPORTING
      E_EXIT_CAUSED_BY_CALLER           =
      ES_EXIT_CAUSED_BY_USER            =
        TABLES
          t_outtab                          = itab[]
       EXCEPTIONS
         program_error                     = 1
         OTHERS                            = 2
    *CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
    *EXPORTING
    *it_fieldcat = lt_slis_fcat
    *TABLES
    *t_outtab = itab
    *EXCEPTIONS
    *program_error = 1
    *OTHERS = 2.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
      break yusufc.
    /code[/code]
    Message was edited by: yusuf tunay çilesiz
    Message was edited by: yusuf tunay çilesiz
    Message was edited by: yusuf tunay çilesiz

    Hi,
    i don't know your real problem,
    but i think this can be a mistake.
      CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
         EXPORTING
          i_program_name               = sy-repid
    data: report like sy-repid.
    report = sy-repid.
    CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
    EXPORTING
    i_program_name = report
    Regards, Dieter
    the same in
    CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
    Regards, Dieter
    Message was edited by: Dieter Gröhn

  • Urgent help required regarding reports Arabic Characters (Right to Left)

    Hello Members
    I am facing problem while deploying oracle reports on application server (Forms & Reports). I am using Developer Suite 10g 10.1.2.0.2 and same version of Application Server on Windows Environment. I have some fields in Arabic and some are in English. The reports output is in PDF format. I am also using PDF Subset fonts feature to subset the Arabic font problem.
    Now the problem which I cannot is that I wanted that PDF generate report read Right to Left only for some specific fields not all fields. For example the following fields displayed as
    395/دمام (Actually reading left to right and same saved in database)
    But I wanted to be numbers are displayed first and then arabic word (dammam) while reading right to left.
    My NLS_settings on developer suite and application server is “AMERICAN_AMERICA.AR8MSWIN1256”
    When I am changing the nls_settings to “ARABIC_SAUDI ARABIA.AR8MSWIN1256”. It convert the whole report layout from righ to left and then it is not reading well the English fields i.e. left to right.

    The problem was solved by changing
    REPORTS_BIDI_ALGORITHM=UNICODE
    REPORTS_ARABIC_NUMERAL=ARABIC
    But now i have another issue that i wanted to display one filed with REPORTS_ARABIC_NUMERAL=ARABIC and second with REPORTS_ARABIC_NUMERAL=HINDI. During my all search i found that this is applied on Report wise and we cannot set for one filed.
    Would any body will help me to change REPORTS_ARABIC_NUMERAL for one field at runtime or design time either changing the registry value or any configuration file of application server ?

  • Urgent!!!! regarding report output

    i have a requirement such that, i need report without top of page..but headers needed to be in the printout in all pages.......pls gv ur suggestions.
    thanks

    Hi,
    I am sending the logo of the alv report.
    REPORT  YMS_EXCISE MESSAGE-ID E4 NO STANDARD PAGE HEADING LINE-SIZE 350.                              .
    TABLES : J_1IEXCHDR,      " header table
             J_1IEXCDTL,      " item table
             J_1IPART2,       " Excise Part II details
             LFA1,            " vendor master table
             J_1IMOVEND,      " vendor excise details table
             MSEG,            " Document Segment: Material
             MKPF,            " Header: Material Document
             DD07T,           " domain text table
             T001W.           " Plant and Branch Details
    DATA : BEGIN OF IT_CHDR OCCURS 100,
           DOCNO LIKE J_1IEXCHDR-DOCNO,
           DOCYR LIKE J_1IEXCHDR-DOCYR,
           EXNUM LIKE J_1IEXCHDR-EXNUM,
           EXDAT LIKE J_1IEXCHDR-EXDAT,
           WERKS LIKE J_1IEXCHDR-WERKS,
           EXBED LIKE J_1IEXCHDR-EXBED,
           EXCCD LIKE J_1IEXCHDR-EXCCD,
           ECS LIKE J_1IEXCHDR-ECS,
           END OF IT_CHDR.
    DATA : BEGIN OF IT_CDTL OCCURS 100,
           DOCYR LIKE J_1IEXCDTL-DOCYR,
           DOCNO LIKE J_1IEXCDTL-DOCNO,
           EXNUM LIKE J_1IEXCDTL-EXNUM,
           EXDAT LIKE J_1IEXCDTL-EXDAT,
           LIFNR LIKE J_1IEXCDTL-LIFNR,
           MATNR LIKE J_1IEXCDTL-MATNR,
           MAKTX LIKE J_1IEXCDTL-MAKTX,
           CHAPID LIKE J_1IEXCDTL-CHAPID,
           EXBAS LIKE J_1IEXCDTL-EXBAS,
           EXBED LIKE J_1IEXCDTL-EXBED,
           ECS   LIKE J_1IEXCDTL-ECS,
           MENGE LIKE J_1IEXCDTL-MENGE,
           MEINS LIKE J_1IEXCDTL-MEINS,
           RDOC2 LIKE J_1IEXCDTL-RDOC2,
           END OF IT_CDTL.
    DATA TEXT(10).
    DATA : BEGIN OF IT_OUT OCCURS 0,
           SERIALNO LIKE J_1IPART2-SERIALNO,
           TEXT1 LIKE TEXT,
           EXNUM LIKE J_1IEXCDTL-EXNUM,
           EXDAT LIKE J_1IEXCDTL-EXDAT,
           NAME LIKE LFA1-NAME1,
           DDTEXT LIKE DD07T-DDTEXT,
           EXCCD LIKE J_1IEXCHDR-EXCCD,
           BUDAT LIKE MKPF-BUDAT,
           EXBAS LIKE IT_CDTL-EXBAS,
           EXBED LIKE IT_CDTL-EXBED,
           ECS   LIKE IT_CDTL-ECS,
           MATNR LIKE IT_CDTL-MATNR,
           MAKTX LIKE IT_CDTL-MAKTX,
           CHAPID LIKE IT_CDTL-CHAPID,
           MENGE LIKE IT_CDTL-MENGE,
           MEINS LIKE IT_CDTL-MEINS,
           DEL_IND(1),
           END OF IT_OUT.
    DATA IT_PART2 LIKE J_1IPART2 OCCURS 0 WITH HEADER LINE.
    DATA S_NO(4) .
    DATA DB_CNT LIKE SY-TABIX.
    DATA EBELN_T LIKE MSEG-EBELN .
    TYPE-POOLS : SLIS.
    DATA : AFIELD TYPE SLIS_FIELDCAT_ALV.
    DATA : LIST_HEADER TYPE SLIS_T_LISTHEADER,
           FIELDCAT TYPE SLIS_T_FIELDCAT_ALV,
           LS_FTCAT TYPE LVC_S_FCAT,
           SORTCAT TYPE SLIS_T_SORTINFO_ALV,
           SORTCAT_LN  LIKE LINE OF SORTCAT,
           G_REPID LIKE SY-REPID,
           G_BACK_GROUND(70),  "like bapibds01-objkey,
           GS_VARIANT LIKE DISVARIANT,
           G_SAVE ,
           GT_EVENTS TYPE SLIS_T_EVENT,
           ALV_EVENT TYPE SLIS_ALV_EVENT,
           EVENTCAT             TYPE SLIS_T_EVENT,
           EVENTCAT_LN          LIKE LINE OF EVENTCAT,
           LAYOUT_IN            TYPE SLIS_LAYOUT_ALV,
           LAYOUT_IN1           TYPE SLIS_LAYOUT_ALV.
    CONSTANTS : GC_FORMNAME_TOP_OF_PAGE TYPE SLIS_FORMNAME VALUE
    'TOP_OF_PAGE',
                GC_FORMNAME_USER_COMMAND TYPE SLIS_FORMNAME VALUE
    'USER_COMMAND',
                GC_FORMNAME_BEFORE_OUTPUT TYPE SLIS_FORMNAME VALUE
    'BEFORE_OUTPUT'.
      ALV_EVENT TYPE SLIS_ALV_EVENT,
    DATA EX_NO LIKE IT_CHDR-EXNUM VALUE 0.
    DATA REGTYP_1 LIKE J_1IPART2-REGTYP.
    SELECTION-SCREEN BEGIN OF BLOCK B WITH FRAME.
    PARAMETERS  WERKS TYPE J_1IEXCHDR-WERKS.
    SELECT-OPTIONS : BUDAT FOR J_1IEXCHDR-EXDAT.
    PARAMETERS : R1 RADIOBUTTON GROUP GRP DEFAULT 'X',
                 R2 RADIOBUTTON GROUP GRP.
    SELECTION-SCREEN END OF BLOCK B.
    INITIALIZATION.
      G_REPID = SY-REPID.
      G_SAVE = 'A'.
    PERFORM BUILD_EVENT USING GT_EVENTS[].
      PERFORM ALV_EVENT_INIT.
    AT SELECTION-SCREEN.
      REFRESH LIST_HEADER.
      PERFORM TOP_OF_PAGE_LIST_HEADER USING LIST_HEADER.
    START-OF-SELECTION.
    PERFORM ALV_EVENT_INIT.
      G_REPID = SY-REPID.
      G_BACK_GROUND = ' ' .
      IF R1 = 'X'.
        CLEAR R2. CLEAR : REGTYP_1.
        REGTYP_1 = 'A'.
         set titlebar 'BALAJI' with DB_CNT.
      ELSEIF R2 = 'X'.
        CLEAR R1.CLEAR : REGTYP_1.
        REGTYP_1 = 'C'.
         set titlebar 'BALAJI1' with DB_CNT.
      ENDIF.
      SELECT * FROM J_1IPART2
                       INTO CORRESPONDING FIELDS OF TABLE IT_PART2
                       WHERE REGTYP = REGTYP_1 AND
                             TRNTYP = 'GRPO' AND
                             BUDAT IN BUDAT.
                              DOCYR = IT_CDTL-DOCYR AND
                              DOCNO = IT_CDTL-DOCNO.
      LOOP AT IT_PART2.
        SELECT SINGLE * FROM J_1IEXCHDR
                  INTO CORRESPONDING FIELDS OF IT_CHDR
                          WHERE  TRNTYP = 'GRPO' AND
                          DOCYR = IT_PART2-DOCYR AND
                          DOCNO = IT_PART2-DOCNO AND
                          WERKS = WERKS AND
                          exdat IN BUDAT.
                       ORDER BY EXDAT.
        IF SY-SUBRC = 0.
          APPEND IT_CHDR.
        ELSE.
          CONTINUE.
        ENDIF.
    IF SY-SUBRC <> 0.
       MESSAGE E084.
    ENDIF.
      ENDLOOP.
      LOOP AT IT_CHDR.
        SELECT * FROM J_1IEXCDTL
                  INTO CORRESPONDING FIELDS OF IT_CDTL
                FOR ALL ENTRIES IN IT_CHDR
                         WHERE
                          TRNTYP = 'GRPO' AND
                          DOCNO  = IT_CHDR-DOCNO AND
                          DOCYR  = IT_CHDR-DOCYR AND
                          EXNUM  = IT_CHDR-EXNUM AND
                          EXDAT  = IT_CHDR-EXDAT AND
                          WERKS  = IT_CHDR-WERKS.
          IF SY-SUBRC = 0.
            APPEND IT_CDTL.
          ELSE.
            CONTINUE.
          ENDIF.
        ENDSELECT.
      ENDLOOP.
      LOOP AT IT_CDTL.
        CLEAR TEXT.
        DB_CNT = DB_CNT + 1.
        READ TABLE IT_CHDR WITH KEY EXNUM = IT_CDTL-EXNUM.
        READ TABLE IT_PART2 WITH KEY DOCNO = IT_CDTL-DOCNO .
        IT_OUT-SERIALNO = IT_PART2-SERIALNO.
        SELECT SINGLE NAME1 FROM LFA1
                        INTO IT_OUT-NAME
                        WHERE LIFNR = IT_CDTL-LIFNR.
        SELECT SINGLE * FROM LFA1
                          WHERE LIFNR = IT_CDTL-LIFNR.
        IF LFA1-LAND1 EQ 'IN'.
          TEXT = 'INVOICE'.
          IT_OUT-TEXT1 = TEXT.
        ELSE.
          TEXT = 'BOE'.
          IT_OUT-TEXT1 = TEXT.
        ENDIF.
        SELECT SINGLE * FROM J_1IMOVEND
                        WHERE LIFNR = IT_CDTL-LIFNR.
        SELECT SINGLE * FROM DD07T
                       INTO IT_OUT-DDTEXT
                        WHERE DOMNAME = 'J_1IVTYP' AND
                              DDLANGUAGE = 'EN' AND
                              DOMVALUE_L = J_1IMOVEND-J_1IVTYP.
      IF DD07T-DDTEXT = 'First Stage Dealer of indigenous excisable goods'
    OR
        DD07T-DDTEXT = 'Second Stage Dealer of indigenous excisablegoods'.
          DD07T-DDTEXT = 'Dealer'.
        ENDIF.
        IT_OUT-DDTEXT = DD07T-DDTEXT.
       ELSEIF DD07T-DDTEXT = 'Second Stage Dealer of indigenous excisable
    *goods'.
          DD07T-DDTEXT =
        CLEAR EBELN_T.
        SELECT SINGLE LFBNR FROM MSEG
                            INTO EBELN_T
                            WHERE MBLNR = IT_CDTL-RDOC2 .
        SELECT SINGLE * FROM MSEG
                          WHERE BWART = '106' AND
                                LFBNR = EBELN_T ."and
                               ebeln = ebeln_t.
        IF SY-SUBRC = 0.
          IT_OUT-DEL_IND = 'X'.
        ELSE.
          IT_OUT-DEL_IND = ' '.
        ENDIF.
        SELECT SINGLE BUDAT FROM MKPF
                          INTO IT_OUT-BUDAT
                          WHERE MBLNR = EBELN_T  ."MSEG-LFBNR.
        IT_OUT-EXNUM = IT_CDTL-EXNUM.
        IT_OUT-EXDAT = IT_CDTL-EXDAT.
        IT_OUT-EXCCD = IT_CHDR-EXCCD.
        IT_OUT-EXBAS = IT_CDTL-EXBAS.
        IT_OUT-EXBED = IT_CDTL-EXBED.
        IT_OUT-ECS   = IT_CDTL-ECS.
        IT_OUT-MATNR = IT_CDTL-MATNR.
        IT_OUT-MAKTX = IT_CDTL-MAKTX.
        IT_OUT-CHAPID = IT_CDTL-CHAPID.
        IT_OUT-MENGE = IT_CDTL-MENGE.
        IT_OUT-MEINS = IT_CDTL-MEINS.
        APPEND IT_OUT.
       EX_NO = IT_CDTL-EXNUM.
      ENDLOOP.
    Title Portion
      IF REGTYP_1 = 'A'.
        SET TITLEBAR 'BALAJI' WITH DB_CNT.
      ELSEIF REGTYP_1 = 'C'.
        SET TITLEBAR 'BALAJI1' WITH DB_CNT.
      ENDIF.
      AFIELD-COL_POS = 1.
      AFIELD-FIELDNAME = 'SERIALNO'.
      AFIELD-SELTEXT_L = 'INPUTS'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 2.
      AFIELD-FIELDNAME = 'TEXT1'.
      AFIELD-SELTEXT_L = 'TYPE OF DOC'.
      AFIELD-JUST = 'L'.
      AFIELD-DECIMALS_OUT = '0'.
      AFIELD-NO_ZERO = 'X'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 3.
      AFIELD-FIELDNAME = 'EXNUM'.
      AFIELD-SELTEXT_L = 'DOC.NO'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 4.
      AFIELD-FIELDNAME = 'EXDAT'.
      AFIELD-SELTEXT_L = 'DOC.DATE'.
      AFIELD-JUST = 'C'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 5.
      AFIELD-FIELDNAME = 'NAME'.
      AFIELD-SELTEXT_L = 'NAME OF THE SUPPLIER'.
      AFIELD-NO_ZERO = 'X'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 6.
      AFIELD-FIELDNAME = 'DDTEXT'.
      AFIELD-SELTEXT_L = 'TYPE-OF-SUPPLIER'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 7.
      AFIELD-FIELDNAME = 'EXCCD'.
      AFIELD-SELTEXT_L = 'ECC OF THE SUPPLIER'.
      AFIELD-NO_ZERO = 'X'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 8.
      AFIELD-FIELDNAME = 'BUDAT'.
      AFIELD-SELTEXT_L = 'INPUT RECV DATE'.
      AFIELD-JUST = 'C'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 9.
      AFIELD-FIELDNAME = 'EXBAS'.
      AFIELD-SELTEXT_L = 'ASSESSABLE-VALUE'.
      AFIELD-DO_SUM             = 'X'.
      AFIELD-JUST = 'R'.
      AFIELD-DECIMALS_OUT = '2'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 10.
      AFIELD-FIELDNAME = 'EXBED'.
      AFIELD-SELTEXT_L = 'DET OF CREDIT TAKEN CENVAT'.
      AFIELD-JUST = 'R'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 11.
      AFIELD-FIELDNAME = 'ECS'.
      AFIELD-SELTEXT_L = 'DET OF CREDIT TAKEN E-CESS'.
      AFIELD-JUST = 'R'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 12.
      AFIELD-FIELDNAME = 'MATNR'.
      AFIELD-SELTEXT_L = 'MATERIAL-CODE'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 13.
      AFIELD-FIELDNAME = 'MAKTX'.
      AFIELD-SELTEXT_L = 'DESCRIPTION'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 14.
      AFIELD-FIELDNAME = 'CHAPID'.
      AFIELD-SELTEXT_L = 'TARIFF-ID'.
      AFIELD-JUST = 'L'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 15.
      AFIELD-FIELDNAME = 'MENGE'.
      AFIELD-SELTEXT_L = 'QUANTITY'.
      AFIELD-JUST = 'R'.
      AFIELD-DO_SUM             = ' '.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 16.
      AFIELD-FIELDNAME = 'MEINS'.
      AFIELD-SELTEXT_L = 'UOM'.
      AFIELD-JUST = 'C'.
      APPEND AFIELD TO FIELDCAT.
      AFIELD-COL_POS = 17.
      AFIELD-FIELDNAME = 'DEL_IND'.
      AFIELD-SELTEXT_L = 'Deleted'.
      AFIELD-JUST = 'C'.
      APPEND AFIELD TO FIELDCAT.
    * LAYOUT FOR ZEBRA CATLOG
      LAYOUT_IN-COLWIDTH_OPTIMIZE = 'X'.
      LAYOUT_IN-ZEBRA             = 'X'.
      LAYOUT_IN-GET_SELINFOS      = 'X'.
      LAYOUT_IN-CONFIRMATION_PROMPT = 'X'.
      LAYOUT_IN-DETAIL_POPUP = 'X' .
    SORTCAT-decimals     = '0'.
      CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
        EXPORTING
          I_CALLBACK_PROGRAM      = G_REPID
          I_CALLBACK_USER_COMMAND = 'USER_COMMAND'
          I_SAVE                  = G_SAVE
          IS_VARIANT              = GS_VARIANT
          IT_FIELDCAT             = FIELDCAT
          IT_SORT                 = SORTCAT
          IS_LAYOUT               = LAYOUT_IN
          IT_EVENTS               = EVENTCAT
         I_BACKGROUND_ID         = g_back_ground
        TABLES
          T_OUTTAB                = IT_OUT.
    *&      Form  TOP_OF_PAGE_LIST_HEADER
          text
         -->LIST_HEADERtext
    FORM TOP_OF_PAGE_LIST_HEADER USING LIST_HEADER TYPE SLIS_T_LISTHEADER.
      DATA : HLINE TYPE SLIS_LISTHEADER,
             TEXT(60) TYPE C.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
    WRITE 'ROOTS INDUSTRIES LTD' TO TEXT.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
      SELECT SINGLE * FROM T001W WHERE WERKS = WERKS.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
      WRITE 'PLANT :' TO TEXT.
      WRITE WERKS TO TEXT+8.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
      WRITE T001W-NAME1 TO TEXT.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
      WRITE T001W-STRAS TO TEXT.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
      WRITE T001W-ORT01 TO TEXT.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
      CLEAR : HLINE,TEXT.
      HLINE-TYP = 'H'.
      WRITE 'DATE :' TO TEXT.
      WRITE BUDAT-LOW TO TEXT+7.
      IF BUDAT-HIGH NE ''.
        WRITE 'TO' TO TEXT+18.
        WRITE BUDAT-HIGH TO TEXT+22.
      ENDIF.
      HLINE-INFO = TEXT.
      APPEND HLINE TO LIST_HEADER.
    ENDFORM.                    "TOP_OF_PAGE_LIST_HEADER
    *&      Form  ALV_EVENT_INIT
          text
    FORM ALV_EVENT_INIT .
      CLEAR ALV_EVENT.
      ALV_EVENT-NAME = SLIS_EV_TOP_OF_PAGE.
      ALV_EVENT-FORM = 'ALV_TOP_OF_PAGE'.
      APPEND ALV_EVENT TO EVENTCAT.
      CLEAR ALV_EVENT.
      ALV_EVENT-NAME = SLIS_EV_TOP_OF_LIST.
      ALV_EVENT-FORM = 'ALV_TOP_OF_LIST'.
      APPEND ALV_EVENT TO EVENTCAT.
       CLEAR ALV_EVENT.
       ALV_EVENT-NAME = SLIS_EV_END_OF_LIST.
       ALV_EVENT-FORM = 'ALV_END_OF_LIST'.
       APPEND ALV_EVENT TO GT_EVENTS.
       CLEAR ALV_EVENT.
       ALV_EVENT-NAME = SLIS_EV_END_OF_PAGE.
       ALV_EVENT-FORM = 'ALV_END_OF_PAGE'.
       APPEND ALV_EVENT TO GT_EVENTS.
    ENDFORM.                    "ALV_EVENT_INIT
    *&      Form  ALV_TOP_OF_PAGE
          text
    FORM ALV_TOP_OF_PAGE.
      CALL FUNCTION 'REUSE_ALV_COMMENTARY_WRITE'
        EXPORTING
          IT_LIST_COMMENTARY = LIST_HEADER
          I_LOGO             = 'ENJOYSAP_LOGO'.
    ENDFORM.                    "ALV_TOP_OF_PAGE
    *&      Form  BUILD_EVENT
          text
         -->P_GT_EVENTS[]  text
    FORM BUILD_EVENT USING P_EVENTS TYPE SLIS_T_EVENT.
      CALL FUNCTION 'REUSE_ALV_EVENTS_GET'
        EXPORTING
          I_LIST_TYPE     = 0
        IMPORTING
          ET_EVENTS       = P_EVENTS
        EXCEPTIONS
          LIST_TYPE_WRONG = 1
          OTHERS          = 2.
      READ TABLE P_EVENTS WITH KEY NAME = SLIS_EV_USER_COMMAND INTO
    ALV_EVENT.
      IF SY-SUBRC = 0.
        MOVE GC_FORMNAME_USER_COMMAND TO ALV_EVENT-FORM.
        APPEND ALV_EVENT TO P_EVENTS.
      ENDIF.
      READ TABLE P_EVENTS WITH KEY NAME = SLIS_EV_BEFORE_LINE_OUTPUT INTO
    ALV_EVENT.
      IF SY-SUBRC = 0.
        MOVE GC_FORMNAME_BEFORE_OUTPUT TO ALV_EVENT-FORM.
        APPEND ALV_EVENT TO P_EVENTS.
      ENDIF.
    ENDFORM.                    " BUILD_EVENT
    Thanks,
    Shankar

  • Regarding a report/urgent

    hi friends
    I have a report and i need to create a ODS on the report.please help me out in finding the characteristics,keyfigures,time char in the report
    The fields in the report are
    Consolidated
    4,923,365
    MRO (incl Litemor)
    4,678,160
    USABB
    245,205
    ACQ1
    ACQ2
    ACQ3
    ACQ4
    ACQ5
    ACQ6
    These fields from ACQ1-ACQ6 have no values.
    PRD
    1
    WK
    1
    day-prd
    1
    day-wk
    1
    consolidated
    4.621%
    MRO (incl Litemor)
    4.585%
    USABB
    5.305%
    My second question
    How to create a datastore object in BI7 help me out with the steps and how to generate a 0recordmode for it?Does the 0recordmode activates automatically or we have to create it .

    hi sivaram,
    may be we can guess however to be precise u can do reverse engineering.
    trace the source of the existing query ie the infoprovider  and try to address the fields.
    byebye

  • Material stock report urgent

    Hi ABAP Guru's
    I got a requirement to develop an report which lists the stock(Opening Stock and Closing stock) for each material of a plant in given date range.whose Values to be matched with either MB5B or MC.9 Tcodes.I have found few tables for Stock like MBEW,MARD but those values are not matching with the Transactions.Can u tell me exactly how can i develop this report.? I'll be very thankful if u do the same.
    DESCRIPTION TABLENAME FIELD NAME
    Plant :
    Material :
    Material group :
    From date :
    to date :
    opening stock :
    total receipt qty :
    total issue qty :
    closing stock :
    unit :
    please provide me table-field name
    its urgent
    regards
    rakesh

    Hi
    is you problem is solved if solved please sene me your code ,i do have same kind of requirment...

  • Assets reports (URGENT)

    Hi all guru's
    we need Assets report with invoice date
    is it possible...
    its very urgent....'
    i can get addtion of the assets, with doucment number, date...
    but we need assets with invoice date.
    regards
    ss

    there's only abap RAZUGA_ALV01: field asset value date (bzdat)
    for analysing bldat you must create a query (sq01/2) with logical database ADA and table ANEK
    A.
    Message was edited by:
            Andreas Mann

  • Re:Center wise report urgent

    Hai Experts,
    For FS10N is there is any option to see by Cost Center and Profir Center wise please let me know urgent same for T.code - F.01 and F.08 also.
    Helpful answer will be assign full points.
    Thanks in advance,
    KUMAR.B.

    Hi Kumar,
    After executing FS10N itself you can change the layout & take the fields Cost center, profit center & many others as you like into the report.
    F.01 & F.08 is much of consolidated standard report which provides results on company code & various summarization levels.
    But you can you can use various other reports Business area, cost Center & profit center wise if you go into IS tab if you have ECC 6.0 version.
    Regards,
    Amol

  • HR-BW report for Travel Expense report(Urgent, max. points awarded)

    Hi All,
    Could anyone please tell how to write a spec to create a BW report for Travel Expense report. or how can we know from which tables can the data be extracted for Personal number, name of the EE, Trip number, Trip duration, Trip begin date, Trip end date, trip destination,  reason for the trip, total cost, reimbursement amount, paid by company, additional amount, total miles/Km,  cost center, CoAr, Status of the trip
    Its very urgent. Please Help!!!!
    Regards,
    Latha

    Hi Latha,
        PR05 is the Tcode for Travel expense Manager where the data will be posted  and The table is PTRV_HEAD   where the data get stored .
    Regards,
    Narendra Kumar Katuri.

  • Urgent --report urgent

    Hallo
    very urgent
      i would like to have the master data "relationsship" included in the BW report.
    It is important information for me when user plan production, as both preparation, processing and cleaning time as well as the "delay" between the start of each equipment adds up being our total production time.
    At this stage user can only get the times for relationsships by clicking on each operation in SAP (for each material).
    what should i do
    regards
    mangra

    Hi mangra
    Include the master data infoobject in your cube and use it in the query
    For calculation like delay, you can creata a formula in the report
    Cheers
    N Ganesh

  • Regarding report painter for PP module

    HI every one,
    Is it there any report painter for PP module.
    Report painter is available for FI module. Like that is it there any thing for PP module.
    Other than SQL Query. Plz suggest me because function people want to do that .
    full points will be awarded for correct answer
    Thanks and Regards,
    P.Naganjana Reddy

    plz urgent help me in thhis case.

  • Regarding Report(Document Flow Report)

    Dear Experts,
    I am working in generating a report which contain fields sales order number(YTPO),Date, Purchase requisition number,Purchase order Number ,date,invoice number,date.
    Is there any standard report which can able to display these detail.Please guide me .This is very urgent.

    Dear expert
    please refer below links
    http://www.easymarketplace.de/transactions-m.php
    http://www.r3.duke.edu/training/stepbystep/
    http://www.finance.utoronto.ca/fast/qrg/purch/po/purchlist.htm
    http://www.polk-fl.net/staff/technology/helpdesk/documents/SAPPASSPUR-Requisition-PurchaseOrderSummary.pdf
    Regards
      Ajeesh.s

Maybe you are looking for

  • Error In scheduling agreement proccessing

    Hi Friends 1. If I enter new schedule line  in JIT  Delivery tab of   scheduling agreement and try to save  it  , it is throwing error that u201CDelivery go ahead was reducedu201D. Message no. V4042. I went ahead and saved the  scheduling agreement 

  • With the new OVI suite recognize phone device as "...

    The problem started when I updated the OVI suite a couple of days before. With the new OVI suite my phone device (Nokia C5) is recognized as "s60 Handset" and I don't have access to my internal phone memory, but the SD card contents only! I tried to

  • Custom Buttons - Overriding paintComponent

    I am thoroughly confused by the amount of different ways I have seen to make a 'custom' button. In my case my 'custom' button is a button that functions exactly as a JButton but I can set a BufferedImage as the background, and when the mouse is over

  • Wifi and Camera not working on Lenovo G50-45 80e300rgin

    I bought the laptop Lenovo G50-45 80e300rgin and installed Windows 8.1 on it. The problem is that when i launch the camera app it shows that 'No camera found' whereas the camera driver was installed successfully. The other problem is that there is no

  • Running without java?

    Hi. Just a quick question...is it possible to generate an .exe file so that a program written in Java can be run without download the Java engine? I know that it would not be platform independent anylonger, but for those who can't install Java on the