Regarding using of LDB PNPCE  in sap hr

Can some one please tell me how to disable some of the selection screen fields and blocks of LDB PNPCE selection-screen which are not used in my report selection-screen?
Thanks,
Phanisreedhar.L

*: Report:  ZP_POSTCODE                                                :
*: Author:  www.SAPDev.co.uk                                           :
*: Date  :  2004                                                       :
*: Description: Displays report of employees by postcode area,         :
*:              includes current travelling allowances (i.e. parking   :
*:              permit or transport card etc..)                        :
*: Use:         Help encourage the use of car sharing and public       :
*:              transport where appropriate.                           :
REPORT  zp_postcode.
type-pools: slis.                                      "ALV Declarations
NODES: pernr.
INFOTYPES: 0000, 0001, 0002, 0006, 0008, 0014, 0105, 0121.
SELECTION-SCREEN BEGIN OF BLOCK pcode WITH FRAME TITLE text-s01.
SELECT-OPTIONS: so_pcode FOR p0006-pstlz.
SELECTION-SCREEN END OF BLOCK pcode.
TYPES: BEGIN OF t_output,
  pernr       TYPE p0001-pernr,   "personnel name
  anredtxt    TYPE t522t-atext,   "title (based on p0002-anred)
  fname       TYPE p0002-vorna,   "first name
  lname       TYPE p0002-nachn,   "last name
  orgtx       TYPE t527x-orgtx,   "dept
  fte         TYPE p0008-bsgrd,   "fte
  parking(20) TYPE c,
  payslip     TYPE t526-sachn,        "payslip address
  telno       TYPE p0105-usrid_long,  "tel number(p0105-usrty = 0020)
  email       TYPE p0105-usrid_long,  "email (p0105-usrty = MAIL)
  postcode    type p0006-pstlz,
END OF t_output.
DATA: it_output TYPE STANDARD TABLE OF t_output INITIAL SIZE 0,
      wa_output TYPE t_output.
*ALV data declarations
data: fieldcatalog   type slis_t_fieldcat_alv with header line,
      gd_tab_group   type slis_t_sp_group_alv,
      gd_layout      type slis_layout_alv,
      gd_repid       like sy-repid,
      gt_events      type slis_t_event,
      gd_prntparams  type slis_print_alv,
      gd_count(6)    type n,
      gd_outtext(70) type c,
      gd_lines       type i.
*START-OF-SELECTION.
START-OF-SELECTION.
clear: gd_count.
GET pernr.
Infotype 0121 is used to store multiple contracts for personnel.
Field p0121-hpern contains the personnel number for the main contract.
  PROVIDE * from p0121 between pn-begda and pn-endda.
  Check if main contract
    if p0121-pernr ne p0121-hpern.
      reject.
    endif.
  ENDPROVIDE.
  add 1 to gd_count.
  concatenate 'Processing personnel data'(m10) gd_count into gd_outtext
            separated by ' '.
Display indicator for employee count
  perform progress_indicator using gd_outtext.
Retrieve datd from infotypes
  rp_provide_from_last p0000 space pn-begda pn-endda.
  rp_provide_from_last p0001 space pn-begda pn-endda.
  rp_provide_from_last p0002 space pn-begda pn-endda.
  rp_provide_from_last p0006 space pn-begda pn-endda.
  rp_provide_from_last p0008 space pn-begda pn-endda.
  rp_provide_from_last p0014 space pn-begda pn-endda.
Check post code
  CHECK p0006-pstlz IN so_pcode.  "cp
Post code
  wa_output-postcode = p0006-pstlz.
Personnel number
  wa_output-pernr = pernr-pernr.
Personnel title
  SELECT SINGLE atext
    FROM t522t
    INTO wa_output-anredtxt
   WHERE sprsl EQ sy-langu AND
         anred EQ p0002-anred.
First name
  wa_output-fname = p0002-vorna.
Last name
  wa_output-lname = p0002-nachn.
Organizational Unit text (dept)
  SELECT SINGLE orgtx
    FROM t527x
    INTO wa_output-orgtx
   WHERE sprsl EQ sy-langu AND
         orgeh EQ p0001-orgeh AND
         endda GE sy-datum.
FTE
  wa_output-fte = p0008-bsgrd.
Parking / travel deducted?
  CASE p0014-lgart.
    WHEN '7180' OR '7181' OR '7182'.
      wa_output-parking = text-002.
    WHEN '7183'.
      wa_output-parking = text-001.
    WHEN '7171' OR '7172' or '7173' or '7174' or
         '7175' or '7176' or '7177' or '7178'.
      wa_output-parking = text-003.
  ENDCASE.
Payslip Address
  SELECT SINGLE sachn
    FROM t526
    INTO wa_output-payslip
   WHERE werks EQ p0001-werks AND
         sachx EQ p0001-sacha.
  PROVIDE * from p0105 between pn-begda and pn-endda.
  Telephone numbers
    if p0105-usrty = '0020'.
       wa_output-telno = p0105-usrid_long.
    endif.
  Email address
    if p0105-usrty = 'MAIL'.
       wa_output-email = p0105-usrid_long.
    endif.
  ENDPROVIDE.
  append wa_output to it_output.
  clear: wa_output.
*END-OF-SELECTION.
END-OF-SELECTION.
describe table it_output lines gd_lines.
if gd_lines gt 0.
  perform build_fieldcatalog.
  perform build_layout.
  perform display_alv_report.
else.
  message i003(zp) with 'No records found'.
endif.
*&      Form  PROGRESS_INDICATOR
      Displays progress indicator on SAP screen
form progress_indicator using p_text.
  call function 'SAPGUI_PROGRESS_INDICATOR'
      exporting
        PERCENTAGE = 0
           text       = p_text.
endform.                    " PROGRESS_INDICATOR
*&      Form  BUILD_FIELDCATALOG
      Build Fieldcatalog for ALV Report
form build_fieldcatalog.
  fieldcatalog-fieldname   = 'PERNR'.
  fieldcatalog-seltext_m   = 'Personnel No.'.
  fieldcatalog-col_pos     = 0.
  fieldcatalog-outputlen   = 10.
fieldcatalog-emphasize   = 'X'.
fieldcatalog-key         = 'X'.
fieldcatalog-do_sum      = 'X'.
fieldcatalog-no_zero     = 'X'.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'ANREDTXT'.
  fieldcatalog-seltext_m   = 'Title'.
  fieldcatalog-col_pos     = 1.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'FNAME'.
  fieldcatalog-seltext_m   = 'First Name'.
  fieldcatalog-col_pos     = 2.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'LNAME'.
  fieldcatalog-seltext_m   = 'Last Name'.
  fieldcatalog-col_pos     = 3.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'ORGTX'.
  fieldcatalog-seltext_m   = 'Department'.
  fieldcatalog-col_pos     = 4.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'FTE'.
  fieldcatalog-seltext_m   = 'FTE'.
  fieldcatalog-col_pos     = 5.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'PARKING'.
  fieldcatalog-seltext_m   = 'Parking/Metrocard'.
  fieldcatalog-col_pos     = 6.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'PAYSLIP'.
  fieldcatalog-seltext_m   = 'Payslip Add.'.
  fieldcatalog-col_pos     = 7.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'TELNO'.
  fieldcatalog-seltext_m   = 'Telephone'.
  fieldcatalog-col_pos     = 8.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'EMAIL'.
  fieldcatalog-seltext_m   = 'E-mail'.
  fieldcatalog-col_pos     = 9.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
  fieldcatalog-fieldname   = 'POSTCODE'.
  fieldcatalog-seltext_m   = 'Post code'.
  fieldcatalog-col_pos     = 10.
  append fieldcatalog to fieldcatalog.
  clear  fieldcatalog.
endform.                    " BUILD_FIELDCATALOG
*&      Form  BUILD_LAYOUT
      Build layout for ALV grid report
form build_layout.
  gd_layout-no_input          = 'X'.
  gd_layout-colwidth_optimize = 'X'.
  gd_layout-totals_text       = 'Totals'(201).
  gd_layout-zebra             = 'X'.
endform.                    " BUILD_LAYOUT
*&      Form  DISPLAY_ALV_REPORT
      Display report using ALV grid
form display_alv_report.
  gd_repid = sy-repid.
  call function 'REUSE_ALV_GRID_DISPLAY'
       exporting
            i_callback_program      = gd_repid
            is_layout               = gd_layout
            it_fieldcat             = fieldcatalog[]
            i_save                  = 'X'
       tables
            t_outtab                = it_output
       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.
endform.                    " DISPLAY_ALV_REPORT
The following program allows you to retrieve all the individuall sickpay values for a given period and person.This data is then exported to memory using the memory id entered on the selection screen. This thereforeallows you to submit this program from another program and then process the data within the calling programby importing the data from memory.  Click here for example .
Report:  ZSXP_ABSENCE_DATA                                           **                                                                      ** Author:  www.SAPdev.co.uk                                            **                                                                      ** Date  :  12.02.2003                                                  **                                                                      ** Description: Retrieve maternaty/Sickness Absence data*                                                                      ************************************************************************REPORT ZSXP_ABSENCE_DATA      LINE-SIZE 100 NO STANDARD PAGE HEADING                MESSAGE-ID 5g.TABLES: t554s, pernr, pcl1, pcl2.INCLUDE rpclst00.INCLUDE rpc2rx09.                      "Payroll results datadefns-Intl.INCLUDE rpc2rxx0.                      "Payroll results datadefns-Intl.INCLUDE rpc2rgg0.                      "Payroll results datadefns-GBINCLUDE rpcfdcg0.                      "Payroll results datadefns-GBINCLUDE rpcdatg0.INCLUDE rpc2cd00.                      "Cluster Directory defns.INCLUDE rpc2ps00.                      "Cluster: Generierte SchematasINCLUDE rpc2pt00.INCLUDE rpcfdc10.INCLUDE rpcfdc00.INCLUDE rpppxd00.INCLUDE rpppxd10.INCLUDE rpcfvp09.INCLUDE rpcfvpg0.INCLUDE rpppxm00.INFOTYPES: 0001,                       "Organisational assignment           0002,                       "Personal Data           0003,                       "Payroll Status           0088,                                            "SMP           2001,                       "Absences           0086.                       "SSP/SMP ExlclusionsDATA:   ssp_weeks TYPE p DECIMALS 2 VALUE 0.DATA:   ssp_total TYPE p DECIMALS 2 VALUE 0,        total_val TYPE p DECIMALS 2 VALUE 0,        smp_weeks TYPE p DECIMALS 2 VALUE 0,        smp_value TYPE p DECIMALS 2 VALUE 0,        gross     LIKE pc207-betrg,        dis_gross TYPE p DECIMALS 2 VALUE 0.DATA: gd_begda(10) TYPE c,      gd_endda(10) TYPE c.DATA: ld_orgtxt LIKE t527x-orgtx.DATA: name(30).DATA: BEGIN OF itab OCCURS 0,      pernr LIKE p0002-pernr,      perid LIKE p0002-perid,      name  LIKE name,      END OF itab.TYPES: BEGIN OF t_report,   pernr   TYPE pernr-pernr,   "8   name    TYPE name,          "30   awart   TYPE p2001-awart,   "4   begda   TYPE p2001-begda,   "10   endda   TYPE p2001-endda,   "10   wkspaid TYPE p DECIMALS 2,  "10   amtpaid TYPE p DECIMALS 2,  "10  END OF t_report.DATA: it_report TYPE STANDARD TABLE OF t_report INITIAL SIZE 0,      wa_report TYPE t_report.DATA: moabw LIKE t001p-moabw.DATA: printheader TYPE i VALUE 1,      gd_success  TYPE i. NCALE declarationsTYPES : BEGIN OF pfra0_pcale,           annee(4) TYPE c.        INCLUDE STRUCTURE pcint.TYPES : END OF pfra0_pcale.TYPES : pfra0_tab_pcale  TYPE  pfra0_pcale  OCCURS 0.DATA:  it_ncale TYPE STANDARD TABLE OF pcnat INITIAL SIZE 0,       wa_ncale TYPE pcnat,       it_pcale TYPE  pfra0_tab_pcale,       pcale  TYPE  pfra0_tab_pcale.* SMP/SSP absence datadata begin of it_msa occurs 0.        include structure pc27j.data end of it_msa.parameters: p_memid type char30.************************************************************************STAR-OF-SELECTIONSTART-OF-SELECTION.gd_begda = pn-begda.gd_endda = pn-endda.gd_begda6(2) = '01'.gd_endda6(2) = '01'.refresh: it_msa.clear:   it_msa.GET pernr.*    PERFORM IMPORT_PC USING GD_SUCCESs.  PERFORM get_rgdir.  while gd_begda le gd_endda.    PERFORM get_new_rg USING gd_begda.    CALL FUNCTION 'CALCULATE_DATE'        EXPORTING*             DAYS        = '0'             MONTHS      = '1'             START_DATE  = gd_begda        IMPORTING             RESULT_DATE = gd_begda.  endwhile.  msa[] = it_msa[].  EXPORT msa TO MEMORY ID p_memid.&---------------------------------------------------------------------&      Form  GET_RGDIR&-------------------------------------------------------------------FORM get_rgdir.  rp-init-buffer.  CLEAR rgdir.  REFRESH rgdir.  MOVE pernr-pernr(8) TO cd-key-pernr.  rp-imp-c2-cd.  IF rp-imp-cd-subrc = 0.                                "rgdir success    SORT rgdir BY seqnr ASCENDING.    CLEAR rgdir.  ENDIF.ENDFORM.-----------------------------------------------------------------**       FORM get_new_rg                                               **-----------------------------------------------------------------**       ........                                                      **-------------------------------------------------------------------**  >  search_date                                                   **-----------------------------------------------------------------FORM get_new_rg USING search_date.  DATA: rg_day TYPE d,        rgbeg  TYPE d,        rgend  TYPE d.  MOVE: search_date TO rg_day.  CLEAR: msa.  LOOP AT rgdir WHERE void NE 'V'.    MOVE: rgdir-fpbeg TO rgbeg,          rgdir-fpend TO rgend.    IF ( rgbeg <= rg_day ) AND       ( rgend >= rg_day ) AND       rgdir-srtza = 'A'.        "Must be periods actual set of results      EXIT.    ENDIF.  ENDLOOP.  UNPACK rgdir-seqnr TO rx-key-seqno.  MOVE pernr-pernr(8) TO rx-key-pernr(8).  rp-imp-c2-rg.  append lines of msa to it_msa.  IF rp-imp-rg-subrc <> 0.   rg fail  ELSE.*   rg success  ENDIF.ENDFORM.Text elements------------------------------------------------------*  001     Sickness History for SSP 1*  002     Employee Name.*  003     National Insurance Number.*  004     Payroll Number.*  005     Sickness Start Date*  006     Sickness End Date*  007     Number of weeks paid*  008     system-error:*  009     No SSP / SMP record found*  010     Absence type*  011     No. weeks paid*  012     Amount*  013     Organisation Unit.*  T01     Sickness Absence typesSelection texts--------------------------------------------------------* SO_SAP          SAP Att./absence types* SO_SMP          SMP Att./absence types* SO_SPP          SPP Att./absence types* SO_SSP          SSP Att./absence types
Uses Logical database 'PNP'(entered in program attributes) to retrieve various personnel data and downloadit to an excel / tab delimited file.
.......................................................................: Report:  ZDOWNEMPDATA                                               ::                                                                     :: Author:  www.SAPDev.co.uk                                           ::                                                                     :: Date  :  2004                                                       ::                                                                     :: Description: Downloads employee data to TAB delimited flat files    ::                                                                     ::.....................................................................:.......................................................................: Report:  ZDOWNEMPDATA                                               ::                                                                     :: Author:  www.SAPDev.co.uk                                           ::                                                                     :: Date  :  2004                                                       ::                                                                     :: Description: Downloads employee data to TAB delimited flat files    ::                                                                     ::.....................................................................:REPORT  zdownempdata                                         .INFOTYPES: 0000, 0001, 0007, 0008, 0121, 0615.NODES: pernr.TABLES: t001p.TYPES: BEGIN OF t_employee,*        INCLUDE STRUCTURE hrms_biw_io_occupancy.  begda     TYPE begda,  endda     TYPE endda,  pernr     TYPE pernr_d,  rfpnr     TYPE rfpnr,  bukrs     TYPE bukrs,  werks     TYPE persa,  btrtl     TYPE btrtl,  persg     TYPE persg,  persk     TYPE persk,  orgeh     TYPE orgeh,  stell     TYPE stell,  plans     TYPE plans,  kokrs     TYPE mast_coar,  kostl     TYPE mast_cctr,  abkrs     TYPE abkrs,  molga     TYPE molga,  trfar     TYPE trfar,  trfgb     TYPE trfgb,  trfkz     TYPE trfkz,  trfgr     TYPE trfgr,  trfst     TYPE trfst,  bsgrd     TYPE bsgrd,  ansal     TYPE ansal_15,  ancur     TYPE ancur,  empct     TYPE empct,  stat2     TYPE stat2,  ncsdate     TYPE hiredate,  sltyp     TYPE p_sltyp,  slreg     TYPE p_slreg,  slgrp     TYPE p_slgrp,  sllev     TYPE p_sllvl,  ansvh     TYPE ansvh,  vdsk1     TYPE vdsk1,  sname     TYPE smnam, END OF t_employee.DATA: it_employee TYPE STANDARD TABLE OF t_employee INITIAL SIZE 0,      wa_employee TYPE t_employee.TYPES: BEGIN OF t_emptexts,*        INCLUDE STRUCTURE hrms_bw_txt_employee.  DATEFROM     TYPE RSDATEFROM,  DATETO     TYPE RSDATETO,  PERNR     TYPE PERSNO,  TXTMD     TYPE EMNAM, END OF t_emptexts.DATA: it_emptexts TYPE STANDARD TABLE OF t_emptexts INITIAL SIZE 0,      wa_emptexts TYPE t_emptexts.TYPES: BEGIN OF t_contract,*        INCLUDE STRUCTURE pa0615.  pernr TYPE p0615-pernr,  begda TYPE p0615-begda,  endda TYPE p0615-endda,  aedtm TYPE p0615-aedtm,  ctype TYPE p0615-ctype,  cbeg  TYPE p0615-cbeg,  cend  TYPE p0615-cend, END OF t_contract.DATA: it_contract TYPE STANDARD TABLE OF t_contract INITIAL SIZE 0,      wa_contract TYPE t_contract.DATA: it_tabemp TYPE filetable,      gd_subrcemp TYPE i,      it_tabempt TYPE filetable,      gd_subrcempt TYPE i,      it_tabcont TYPE filetable,      gd_subrccont TYPE i.DATA: gd_downfile TYPE string.SELECTION-SCREEN BEGIN OF BLOCK block1 WITH FRAME TITLE text-001.PARAMETERS: p_emp   LIKE rlgrap-filename,            p_empt  LIKE rlgrap-filename,            p_cont LIKE rlgrap-filename.SELECTION-SCREEN END OF BLOCK block1.***********************************************************************at selection-screenAT SELECTION-SCREEN ON VALUE-REQUEST FOR p_emp.  REFRESH: it_tabemp.  CALL METHOD cl_gui_frontend_services=>file_open_dialog    EXPORTING      window_title      = 'Select File'      default_filename  = '.xls'      initial_directory = 'C:\'      multiselection    = ' '  "No multiple selection    CHANGING      file_table        = it_tabemp      rc                = gd_subrcemp.  LOOP AT it_tabemp INTO p_emp.  ENDLOOP.***********************************************************************at selection-screenAT SELECTION-SCREEN ON VALUE-REQUEST FOR p_empt.  REFRESH: it_tabemp.  CALL METHOD cl_gui_frontend_services=>file_open_dialog    EXPORTING      window_title      = 'Select File'      default_filename  = '.xls'      initial_directory = 'C:\'      multiselection    = ' '  "No multiple selection    CHANGING      file_table        = it_tabempt      rc                = gd_subrcempt.  LOOP AT it_tabempt INTO p_empt.  ENDLOOP.***********************************************************************at selection-screenAT SELECTION-SCREEN ON VALUE-REQUEST FOR p_cont.  REFRESH: it_tabcont.  CALL METHOD cl_gui_frontend_services=>file_open_dialog    EXPORTING      window_title      = 'Select File'      default_filename  = '.xls'      initial_directory = 'C:\'      multiselection    = ' '  "No multiple selection    CHANGING      file_table        = it_tabcont      rc                = gd_subrccont.  LOOP AT it_tabcont INTO p_cont.  ENDLOOP.************************************************************************START-OF-SELECTION.START-OF-SELECTION.GET pernr. Selecting the latest infotype record  rp_provide_from_last p0000 space pn-begda pn-endda.  rp_provide_from_last p0001 space pn-begda pn-endda.  rp_provide_from_last p0007 space pn-begda pn-endda.  rp_provide_from_last p0008 space pn-begda pn-endda.  rp_provide_from_last p0121 space pn-begda pn-endda.  rp_provide_from_last p0615 space pn-begda pn-endda.  MOVE-CORRESPONDING p0001 TO wa_employee.  wa_employee-rfpnr = p0121-rfp01. "?????  MOVE-CORRESPONDING p0007 TO wa_employee.  MOVE-CORRESPONDING p0008 TO wa_employee.  MOVE-CORRESPONDING p0000 TO wa_employee.  SELECT SINGLE molga    FROM t001p    INTO wa_employee-molga   WHERE werks EQ p0001-werks AND         btrtl EQ p0001-btrtl.  SELECT SINGLE trfkz    FROM t503    INTO wa_employee-trfkz   WHERE persg EQ p0001-persg AND         persk EQ p0001-persk.  CALL FUNCTION 'HR_ENTRY_DATE'    EXPORTING      persnr                     = pernr-pernr*   RCLAS                      =*   BEGDA                      = '18000101'*   ENDDA                      = '99991231'*   VARKY                      =   IMPORTING      entrydate                  = wa_employee-ncsdate* TABLES*   ENTRY_DATES                = EXCEPTIONS   ENTRY_DATE_NOT_FOUND       = 1   PERNR_NOT_ASSIGNED         = 2   OTHERS                     = 3            .  IF sy-subrc <> 0.* MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO*         WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.  ENDIF.* append employee data  APPEND wa_employee TO it_employee.  CLEAR: wa_employee.  wa_emptexts-datefrom = p0001-begda.  wa_emptexts-dateto   = p0001-endda.  wa_emptexts-pernr    = p0001-pernr.  wa_emptexts-txtmd    = p0001-ename.* append employee texts data  APPEND wa_emptexts TO it_emptexts.  CLEAR: wa_emptexts.  MOVE-CORRESPONDING p0615 TO wa_contract.* append employee contract data  APPEND wa_contract TO it_contract.  CLEAR: wa_contract.************************************************************************END-OF-SELECTION.END-OF-SELECTION. download employee data  IF NOT p_emp IS INITIAL.    gd_downfile = p_emp.    CALL FUNCTION 'GUI_DOWNLOAD'      EXPORTING        filename              = gd_downfile        filetype              = 'ASC'        write_field_separator = 'X'      TABLES        data_tab              = it_employee.    IF sy-subrc EQ 0.      WRITE:/ 'Employee file downloaded to',              gd_downfile.    ELSE.      WRITE:/ 'There was an error downloading Employee file to',              gd_downfile.    ENDIF.  ENDIF.* download employee texts data  IF NOT p_empt IS INITIAL.    gd_downfile = p_empt.    CALL FUNCTION 'GUI_DOWNLOAD'      EXPORTING        filename              = gd_downfile        filetype              = 'ASC'        write_field_separator = 'X'      TABLES        data_tab              = it_emptexts.    IF sy-subrc EQ 0.      WRITE:/ 'Employee text file downloaded to',              gd_downfile.    ELSE.      WRITE:/ 'There was an error downloading Employee text file to',              gd_downfile.    ENDIF.  ENDIF.* download contract data  IF NOT p_cont IS INITIAL.    gd_downfile = p_cont.    CALL FUNCTION 'GUI_DOWNLOAD'      EXPORTING        filename              = gd_downfile        filetype              = 'ASC'        write_field_separator = 'X'      TABLES        data_tab              = it_contract.    IF sy-subrc EQ 0.      WRITE:/ 'Employee contract file downloaded to',              gd_downfile.    ELSE.      WRITE:/ 'There was an error downloading Employee contract file to',              gd_downfile.    ENDIF.  ENDIF.

Similar Messages

  • Regarding LDB pnpce

    hi experts,
    i m in need to create a report means i have to design the
    screen,in which i have to use LDB pnpce for HR,but if i select
    program type "module pool" in the report attributes  the filed
    LDB name is not coming means but when i select executable the LDB field is coming but when i select type module pool the it is not coming
    ....plz help me is there any way so that i can use ldb as well
    as module pool report type...............

    Hi
    you can call even LDB by using FM LDB_PROCESS. then you can attach the report to screen that you have designed.
    what you have to do is goto SE38---> Create a new report of type executable and don't select any LDB .
    2. Call teh function module LDB_PROCESS from the report and pass teh LDb name to this Fm
    [further Information|http://help.sap.com/saphelp_nw70/helpdata/en/64/237f8cd43711d1950b0000e8353423/content.htm]
    Regards
    Pavan

  • FM's used in report program using ldb pnpce

    hii all,
      will anybody provide me function modules that are used to populate data in report program using ldb pnpce.
    <REMOVED BY MODERATOR>
    thanks in advance
    regards
    Ashweeni.
    Edited by: Alvaro Tejada Galindo on Mar 18, 2008 6:01 PM

    U can use all the FM's which were used for LDB PNP ..
    For ex : Use the below to get the payroll results ..
    To get the results directory
      call function 'CU_READ_RGDIR'
        exporting
          persnr          = peras-pernr
        tables
          in_rgdir        = pc261_tab
        exceptions
          no_record_found = 1
          others          = 2.
    to get evaluation periods ...
    call function 'CD_EVALUATION_PERIODS'
    There are no particular FM's that will populate data in report
    program .. please let me know what is the requirement ...

  • How to use ldb PNPCE with FM u0091HR_INFOTYPE_OPERATIONu0092

    Hi all,
    I’m creating a report with LDB PNPCE, this report has to create/modify infotypes of an ID person. I’m trying to use de FM ‘HR_INFOTYPE_OPERATION’, but it’s not working… A DUMP is generated, with this description:
    An exception that could not be caught occurred.CX_HRPA_VIOLATED_PRECONDITION
    I think that the problem is due to logical database PNPCE, because if I use PNP, it’s working… Does anybody know anything about using the FM ‘HR_INFOTYPE_OPERATION’ with the LDB PNPCE?
    Thanks!!

    This piece of code it's working with ldb PNP 
    CALL FUNCTION 'ENQUEUE_EPPRELE'
       EXPORTING
      MODE_PREL            = 'E'
      MANDT                = SY-MANDT
         pernr                = wa_p9961-pernr
         infty                = '9961'
      SUBTY                =
      OBJPS                =
      SPRPS                =
    endda                =  wa_p9961-endda                      "'99991231'
    begda                =  wa_p9961-begda                      "'20071201'
      SEQNR                =
      X_PERNR              = ' '
      X_INFTY              = ' '
      X_SUBTY              = ' '
      X_OBJPS              = ' '
      X_SPRPS              = ' '
      X_ENDDA              = ' '
      X_BEGDA              = ' '
      X_SEQNR              = ' '
      _SCOPE               = '2'
      _WAIT                = ' '
      _COLLECT             = ' '
       EXCEPTIONS
         foreign_lock         = 1
         system_failure       = 2
         OTHERS               = 3
      CALL FUNCTION 'HR_INFOTYPE_OPERATION'
        EXPORTING
          infty                   = '9961'
          number                  = wa_p9961-pernr
           subtype                = wa_p9961-subty
            OBJECTID               =
            lockindicator          = 'X'
           validityend            = wa_p9961-endda
           validitybegin          = wa_p9961-begda
            recordnumber           = lwa_pa9961-seqnr
          record                  = wa_p9961
          operation               = 'INS'
          tclas                   = 'A'
          dialog_mode             = '0'
            nocommit               = ' '
            VIEW_IDENTIFIER        =
            SECONDARY_RECORD       =
       IMPORTING
         return                 = l_return
            KEY                    =
      CALL FUNCTION 'DEQUEUE_EPPRELE'
       EXPORTING
      MODE_PREL       = 'E'
      MANDT           = SY-MANDT
         pernr           = wa_p9961-pernr
         infty           = '9961'
      SUBTY           =
      OBJPS           =
      SPRPS           =
    endda                = wa_p9961-endda                       "'99991231'
    begda                = wa_p9961-begda                       "'20071201'
      SEQNR           =
      X_PERNR         = ' '
      X_INFTY         = ' '
      X_SUBTY         = ' '
      X_OBJPS         = ' '
      X_SPRPS         = ' '
      X_ENDDA         = ' '
      X_BEGDA         = ' '
      X_SEQNR         = ' '
      _SCOPE          = '3'
      _SYNCHRON       = ' '
      _COLLECT        = ' '
    But if I use ldb PNPCE instead PNP, with the events:
    GET person.
    GET group.
    GET peras.
    ths dump is generated...
    Thank u!!

  • Regarding ldb pnpce and my customized infotype

    i have created my own infotype name '9777' and with the help of
    'hr_infotype_operation' i m inserting the data into this infotype
    now i m creating a report in which i m using ldb pnpce,
    but after the execution of GET PERAS the infotype table p9777
    is not populating but except this other infotypes tables are populating
    ,plz help me to sort out this problem.

    hi after the bapi did you used the commit .
    use this for the creation of an employee
    BAPI_EMPLCOMM_CREATE
    o give  your code here

  • Not able to use macro with LDB PNPCE

    Hi,
    I am trying to use macro 'rp-provide-from-last' as below with LDB PNPCE.But syntax error 'unable to  interpret SPACE' has occurred.
    rp-provide-from-last p0001 space pn-begda pn-endda.
    Please let me know how to use this macro with LDB PNPCE.

    The reason you are getting this error is that you would have used the GET Pernr. in start of selection.For PNPCE u have to define
    Nodes : person, peras.
    and then use the
    Get PERSON.
    Get PERAS in start of selection
    and then u can use the standard macros without any errors.

  • How to give pernr in range using LDB PNPCE

    I am using LDB PNPCE and in report category i want to give select option for pernr that will accept pernr in ranges also.So Please tell me how to give ranges of pernr.
    Thanx in advance.

    Hi,
    You mean that you want to set a range of personnel numbers as default on selection screen when running the report?
    If so, you can do that. That field is PNPPERNR, it is a select-option, set default values for it in event INITIALIZATION of your report.
    pnppernr-sign = 'I'.
    pnppernr-option = 'BT'.
    pnppernr-low = ....
    pnppernr-high = ...
    append pnppernr.
    Thanks

  • Authorization for LDB PNPCE &PNPPS and table T77S0

    Hi folks ,
    I’m working on a very interesting requirement , I have developed an Ad hoc query , which is reading IT0019 ( Monitoring dates infotype ) with field called task type . I take a test login and give task type which is equal = ‘w’ . When I was running that query in test login to see security is in place or not . I found that whenever there’s two recs in IT0019 with task type ‘W’ 9 which test login has authorization and ‘W2’ ( which test login doesn’t have authorization ) its not pulling up any record . its giving no data . to make sure I again went in to Infotype IT0019 and delete the task type (W2 : the one which test login doesn’t have authorization ) . then I run the query . it pull up one record . So my question is how can I handle this situation in Adhoc query . I mean logically speaking it should pull up at least one record for which it has authorization . I am using LDB PNPCE .
    Moreover , I debug the query and I came to know its reading the the table T77S0 using class : CL_HR_T77S0.
    I read the about table (T77S0) , another question if I set another entry in the table with PNPPS and AUTSW. Will it works . Can I control it?
    http://help.sap.com/saphelp_erp2005/helpdata/en/84/49ba3b3bf00152e10000000a114084/content.htm
    Thanks,
    SK

    Hello Amit,
    you have to run the "copy" action ,while changing OM objects. then only it will effect in IT 0001
    if you will click on change then it will not update in PA.
    so click on Copy then do the changes and save it. it will update IT 0001.
    We had the same issue. if you get any solution then let me know.
    OR
    Will you try running  RHINTE30 Report
    do batch input session and run it via SM35
    Thanks and Regards
    Jaydeep Jadhav

  • How to avoid default selection screen in HR interfaces(using pnp ldbs)

    How to avoid default selection screen in HR interfaces(using pnp ldbs)

    Dear Rakesh,
    The report category is used to change the selection screen of programs that use the 'PNP' logical database.
    See links bellow:
    http://www.sapdevelopment.co.uk/hr/hr_repcat.htm
    http://help.sap.com/saphelp_erp2005/helpdata/en/15/229357553611d3967f00a0c9306433/frameset.htm
    Report categories for selection screen in HR programming
    Also visit the following blog:
    /people/alvaro.tejadagalindo/blog/2006/02/19/how-to-deal-with-hr-payroll-reports
    Regards,
    Naveen.

  • If I use a LDB in the Attributes of the Program what happens?

    Hi friends,
                   I have to modify a standard program RFRECPSFA410. which i need to add some more fields in the output layout. It is a standard program. In the attributes of the program he used the LDB name RECN. And while debugging i found that the program is calling logical database. How it is calling I could not understand. And I need to add the fields in the Output Lay out. How can I add?

    Hi
    LDB - Logical Database are special ABAP programs that retrieve data and make it available to application programs. The most common use of logical databases is still to read data from database tables by linking them to executable ABAP programs. They provide selction-screen, authority-check etc.
    For detailed information see the following links:
    Overview:
    http://help.sap.com/saphelp_nw04/helpdata/en/60/183d78163011d2953c0000e8353423/frameset.htm
    Using Logical Databases:
    http://help.sap.com/saphelp_nw04/helpdata/en/60/183d78163011d2953c0000e8353423/frameset.htm
    Regards
    Surya.

  • How to create a new selection screen LDBS PNPCE

    how to create a new selection screen LDBS PNPCE

    Hello Ankit,
    Do you want to create a new selection screen in LDB PNPCE, or do you want to create a new selection screen in one of your reports using LDB PNPCE?
    For later (which is more common), you can use HR Report Category.
    Hope this helps.
    Best Regards,
    Biraju Rajyaguru

  • Ldb pnpce

    hi,
    i have to display a report using ldb PNPCE .Displayed Data should be between the date period entered in selection-screen. say pn-begda = 11.02.2008 and pn-endda = 17.02.2008.for this i hav written code
    GET PERAS.
    PROVIDE massn massg begda pernr stat2 FROM P0000
              BETWEEN pn-begda AND pn-endda .
    MOVE:
    p0000-begda TO wa_data-begda,
    p0000-pernr TO wa_data-pernr,  etc....
    ENDPROVIDE.
    but in output its displaying all data with BEGDA what i entered in selection-screen( i.e 11.02.2008)  for all PERNR.
    i tried ldb PNP but its displaying date what existing in database for corresponding  PERNR .even this also not displaying in date range what i entered in selection screen. i tried with standard report categoty and custom report category. 
    is there anything additional coding should add ?
    thanks,
    rajkumar.

    Hi Raj
    Just try this report
    S_AHR_61016380 - Logged Changes in Infotype Data
    Regards
    Santhosh.S

  • How to use open data set in SAP

    Hi SAP Gurus,
            Could anyone help, how to use open data set in SAP.
          I need to upload a file from Application server (ZSAPUSAGEDATA) to internal table (IT_FINAL).
    Thanks & Regards,
    Krishnau2026

    Hi Krishna.
    These are the steps you need to follow.
    tables: specify the table.
    data: begin of fs_...
            end of fs_    " Structure Field string.
    data: t_table like
            standard table
                      of fs_...
    data:
    w_file TYPE string.
    data:
      fname(10) VALUE '.\xyz.TXT'.
    select-options: if any.
    PARAMETERS:
      p_file LIKE rlgrap-filename.
    w_file = p_file.
    select .... statement
    OPEN DATASET fname FOR OUTPUT IN TEXT MODE ENCODING DEFAULT.
    *OPEN DATASET fname FOR OUTPUT IN BINARY MODE.
    LOOP AT t_... INTO fs_....
    write:/ .....
    TRANSFER fs_... TO fname.
    or
    TRANSFER t_... TO fname
    ENDLOOP.
    CLOSE DATASET fname.
    Reward points wisely and if you are benefitted or ask for more detailed explanation if problem not solved.
    Regards Harsh.

  • How to Improve performance issue when we are using BRM LDB

    HI All,
    I am facing a performanc eissue when i am retriving the data from BKPF and respective BSEG table....I see that for fiscal period there are around 60lakhs records. and to populate the data value from the table to final internal table its taking so much of time.
    when i tried to make use of the BRM LDB with the SAP Query/Quickviewer, its the same issue.
    Please suggest me how to improve the performance issue.
    Thanks in advance
    Chakradhar

    Moderator message - Please see Please Read before Posting in the Performance and Tuning Forum before posting - post locked
    Rob

  • How can I use Seeburger java functions on SAP XI's user defined functions?

    Hi All,
    As my title implies; how can I use Seeburger java functions on SAP XI's user defined functions?  I've tried searching over the net in tutorials regarding this topic but I failed to find one; can someone provide me information regarding my question? thanks very much.
    best regards,
    Mike

    Hi Mike !
    You should check your documentation about which java classes you need to reference in the "import" section of your UDF. And also deploy the java classes into the java stack or include them as a imported archive in integration repository...it should be stated in the seeburger documentation.
    What kind of functions are you trying to use?
    Regards,
    Matias.

Maybe you are looking for

  • Need a copy of acroread for Solaris 10 on SPARC

    I've checked the ftp download pages and any Solaris  reference to acroread is a dead link, Can someone post me a working link where I can download the latest Solaris on SPARC copy of acroread?

  • How can I transfer bookmarks from my old (dead) computer's good hard drive?

    My old computer is dead but the hard drive is good. I had Vista on the old computer and Firefox 6 or 7, I'm not sure. The new computer is Win 7 professional, 64 bit and has Firefox 8 on it. The old C drive is now an external USB drive on my new compu

  • I screwed something up. what package is mount in?

    I have lost the mount and umount binaries, so archlinux is fuked coz it cant mount on startup or umount on shutdown... I can chroot in and use pacman I guess, but what package contians mount and umount? I guess I lost them after doing a pacman -Syu t

  • Print not matching lcd

    I have my 5D set to AdobeRGB, I have my PSCS2 working space set to AdobeRGB. I make Layer Adjustments, then print without saving(is saving prior to printing a good idea?). Prints are coming out too dark. I have recently (last 2 weeks) calibrated usin

  • Real problem with highlights

    Sorry for posting a new one but I am in real trouble here On a simple menu with 3 buttons that i built in photoshop CS2 I have a nice simulation with the correct highlights appearing on my buttons when I roll over then if i build the DVD the buttons