Mostrar Mensajes

Esta sección te permite ver todos los posts escritos por este usuario. Ten en cuenta que sólo puedes ver los posts escritos en zonas a las que tienes acceso en este momento.


Temas - Enrique.Borroni

Páginas: 1 [2] 3
16
ALV / ALV - Ejemplo de como poner mas de una Linea en la Cabecera
« en: 09 de Agosto de 2009, 08:58:58 am »
Este es un ejemplo de como poner mas de una linea en la cabecera de un ALV utilizando la funcion : RKD_WORD_WRAP

Codigo Ejemplo :

REPORT Y_ALV_MULTI_LINEA .

TYPE-POOLS slis .

*----------------------------------------------------------------------*
* DECLARACION DE DATOS
*----------------------------------------------------------------------*
CONSTANTS : c_len TYPE i VALUE 20 .

TYPES : BEGIN OF ty_t100 ,
          sprsl TYPE t100-sprsl ,
          arbgb TYPE t100-arbgb ,
          msgnr TYPE t100-msgnr ,
          text TYPE t100-text ,
          fline TYPE t100-text ,
        END OF ty_t100 .

TYPES : BEGIN OF ty_wrd ,
          text TYPE char20 ,
        END OF ty_wrd .

DATA : it_t100 TYPE TABLE OF ty_t100    ,
       it_sentence TYPE TABLE OF ty_wrd ,
       wa_t100 TYPE ty_t100             ,
       wa_word TYPE ty_wrd              ,
       v_repid TYPE syst-repid          ,
       v_tabix TYPE syst-tabix          .

DATA : it_fld TYPE slis_t_fieldcat_alv ,
       it_evt TYPE slis_t_event        ,
       wa_fld TYPE slis_fieldcat_alv   ,
       wa_evt TYPE slis_alv_event      ,
       wa_lay TYPE slis_layout_alv     .


*----------------------------------------------------------------------*
* INITIALIZATION
*----------------------------------------------------------------------*
INITIALIZATION .
  v_repid = sy-repid .


*----------------------------------------------------------------------*
* START-OF-SELECTION
*----------------------------------------------------------------------*
START-OF-SELECTION .


* Leer Datos para ALV
  SELECT *
    INTO TABLE it_t100
    FROM t100
   WHERE sprsl = 'EN'
     AND arbgb = '00' .

  LOOP AT it_t100 INTO wa_t100 .
    v_tabix = sy-tabix .
    CLEAR : it_sentence .


*   Cortar Texto en Varias Lineas
    CALL FUNCTION 'RKD_WORD_WRAP'
      EXPORTING
        textline  = wa_t100-text
        outputlen = c_len
      TABLES
        out_lines = it_sentence.

    IF NOT it_sentence IS INITIAL .
      READ TABLE it_sentence INTO wa_word INDEX 1 .
      wa_t100-fline = wa_word-text .
      MODIFY it_t100 FROM wa_t100 INDEX v_tabix .
    ENDIF.

  ENDLOOP.


*  Catalogo de Campos para el ALV
  CLEAR wa_fld .
  wa_fld-fieldname = 'SPRSL' .
  wa_fld-ref_tabname = 'T100' .
  wa_fld-ref_fieldname = 'SPRSL' .
  APPEND wa_fld TO it_fld .

  CLEAR wa_fld .
  wa_fld-fieldname = 'ARBGB' .
  wa_fld-ref_tabname = 'T100' .
  wa_fld-ref_fieldname = 'ARBGB' .
  APPEND wa_fld TO it_fld .

  CLEAR wa_fld .
  wa_fld-fieldname = 'MSGNR' .
  wa_fld-ref_tabname = 'T100' .
  wa_fld-ref_fieldname = 'MSGNR' .
  APPEND wa_fld TO it_fld .

  CLEAR wa_fld .
  wa_fld-fieldname = 'FLINE' .
  wa_fld-inttype = 'CHAR' .
  wa_fld-outputlen = 20 .
  wa_fld-intlen = 20.
  wa_fld-seltext_l = 'Text' .
  wa_fld-ddictxt = 'L' .
  APPEND wa_fld TO it_fld .


* Se Ejecuta Antes y Despues de Desplegar la Linea
  CALL FUNCTION 'REUSE_ALV_EVENTS_GET'
    IMPORTING
      et_events = it_evt.

  READ TABLE it_evt INTO wa_evt
       WITH KEY name = slis_ev_after_line_output .
  wa_evt-form = slis_ev_after_line_output .
  MODIFY it_evt FROM wa_evt INDEX sy-tabix .

  READ TABLE it_evt INTO wa_evt
       WITH KEY name = slis_ev_top_of_page .
  wa_evt-form = slis_ev_top_of_page .
  MODIFY it_evt FROM wa_evt INDEX sy-tabix .
  wa_lay-no_colhead = 'X' .

  CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
    EXPORTING
      i_callback_program = v_repid
      it_fieldcat        = it_fld
      is_layout          = wa_lay
      it_events          = it_evt
    TABLES
      t_outtab           = it_t100.



*---------------------------------------------------------------------*
* FORM top_of_page *
*---------------------------------------------------------------------*
FORM top_of_page .
  ULINE AT 1(58) .
  FORMAT COLOR COL_HEADING .
  WRITE: / sy-vline ,
          02 'Header1' ,
          10 sy-vline ,
          11 'Header1' ,
          31 sy-vline ,
          32 'Header1' ,
          37 sy-vline ,
          38 'Header1' ,
          58 sy-vline .
          WRITE: / sy-vline ,
          02 'Header2' ,
          10 sy-vline ,
          11 'Header2' ,
          31 sy-vline ,
          32 'Header2' ,
          37 sy-vline ,
          38 'Header2' ,
          58 sy-vline .

ENDFORM.                    "top_of_page



*---------------------------------------------------------------------*
* FORM AFTER_LINE_OUTPUT *
*---------------------------------------------------------------------*
FORM after_line_output USING rs_lineinfo TYPE slis_lineinfo .

  CLEAR : it_sentence ,
          wa_t100      .

  READ TABLE it_t100 INTO wa_t100 INDEX rs_lineinfo-tabindex .
  CHECK sy-subrc = 0 .

  CALL FUNCTION 'RKD_WORD_WRAP'
    EXPORTING
      textline  = wa_t100-text
      outputlen = c_len
    TABLES
      out_lines = it_sentence.

  DESCRIBE TABLE it_sentence LINES v_tabix .
  CHECK v_tabix > 1 .

  LOOP AT it_sentence INTO wa_word FROM 2 .
    WRITE: / sy-vline ,
            10 sy-vline ,
            31 sy-vline ,
            37 sy-vline ,
            38 wa_word-text ,
            58 sy-vline .
  ENDLOOP.

ENDFORM .                    "after_line_output


18
Reports / Reporte para Mostrar el Detalle de los Materiales Configurables
« en: 08 de Agosto de 2009, 09:41:52 am »
Este reporte es un ejemplo de como obtener los detalles de configuracion de los Materiales
del Tipo Configurables...

Elementos de Textos para el Programa :

* Elementos de Texto
* ----------------------------
* I002     Material configurable
* I004     Página
* I006     Ce.:
* I102     Centro
* I103     Denominación
* I111     Característica
* I112     Valor

* Textos de Seleccion
* -----------------------------------
* SPM_CONFG        Visualizar valoración
* SPM_DATUM        Fecha
* SPM_STDPD        Material configurable
* SPM_WERKS        Centro




REPORT Y_REPO_MAT_CONFIGURABLE.
MESSAGE-ID cu
        NO STANDARD PAGE HEADING
        LINE-SIZE 80.
TABLES :
         conf_out,
         makt,
         mara,
         marc,
         mava1,
         mtcom,
         pgmi,
         sscrfields.

PARAMETERS :
         pm_stdpd LIKE mara-matnr   MEMORY ID mat MATCHCODE OBJECT mat1,
         pm_werks LIKE marc-werks,
         pm_datum LIKE cabn-datuv    DEFAULT sy-datum,
         pm_confg LIKE rmclre-rmerka DEFAULT space,
         pm_slmod TYPE c             NO-DISPLAY.


DATA:
  printing(1) TYPE c,
  configuration LIKE conf_out OCCURS 0 WITH HEADER LINE.


DATA :  BEGIN OF cincl.
        INCLUDE STRUCTURE incl_bild.
DATA :  END OF cincl,
         BEGIN OF cwind.
        INCLUDE STRUCTURE linerow.
DATA :   END OF cwind,
         object_found TYPE c,
         object_done TYPE c,
         BEGIN OF xmakt OCCURS 0,
           matnr LIKE makt-matnr,
           maktx LIKE makt-maktx,
         END OF xmakt,
         BEGIN OF xpgmi OCCURS 0,
           nrmit LIKE pgmi-nrmit,
           werks LIKE pgmi-werks,
           wemit LIKE pgmi-wemit,
         END OF xpgmi,
         BEGIN OF xxx OCCURS 0,
           x,
         END OF xxx,

         frame_size LIKE sy-linsz,
         len_matnr LIKE sy-fdpos,
         len_maktx LIKE sy-fdpos,
         len_werks LIKE sy-fdpos,
         len_atbez LIKE sy-fdpos,
         len_atwtb LIKE sy-fdpos,
         xposition LIKE sy-fdpos,
         xtext     LIKE sy-lisel,
         ytext     LIKE sy-lisel.

FIELD-SYMBOLS:
         <xtext>, <ytext>.

CONSTANTS :
         mtcom_kenng_makt LIKE mtcom-kenng VALUE 'MAKT',
         mtcom_kenng_mava1 LIKE mtcom-kenng VALUE 'MAVA1',
         param_cux LIKE tpara-paramid VALUE 'CUX',
         param_wrk LIKE tpara-paramid VALUE 'WRK',
         pgtyp_s LIKE pgmi-pgtyp VALUE 'S',
         x TYPE c VALUE 'X'.

INITIALIZATION.
  DESCRIBE FIELD marc-matnr     LENGTH  len_matnr IN CHARACTER MODE.
  DESCRIBE FIELD marc-werks     LENGTH len_werks IN CHARACTER MODE.
  DESCRIBE FIELD makt-maktx     LENGTH len_maktx IN CHARACTER MODE.
  DESCRIBE FIELD conf_out-atbez LENGTH len_atbez IN CHARACTER MODE.
  DESCRIBE FIELD conf_out-atwtb LENGTH len_atwtb IN CHARACTER MODE.
  IF pm_confg IS INITIAL.
    frame_size = len_matnr + len_werks + len_maktx + 4.
  ELSE.
    frame_size = len_atbez + len_atwtb + 3.
  ENDIF.

  GET PARAMETER ID param_wrk FIELD pm_werks.

AT SELECTION-SCREEN.
  IF pm_confg IS INITIAL.
    frame_size = len_matnr + len_werks + len_maktx + 4.
  ELSE.
    frame_size = len_atbez + len_atwtb + 3.
  ENDIF.
  PERFORM header_prepare.
  CLEAR printing.
  IF sscrfields-ucomm = 'PRIN'.
    NEW-PAGE LINE-COUNT 65.
    printing = 'X'.
  ENDIF.

START-OF-SELECTION.
  SET PF-STATUS 'ZSTATUS'.
  PERFORM types_select.
  PERFORM types_prepare.

END-OF-SELECTION.
  PERFORM show_result.

TOP-OF-PAGE.
  PERFORM print_header.

TOP-OF-PAGE DURING LINE-SELECTION.
  PERFORM print_header.

AT LINE-SELECTION.
  IF pm_slmod IS INITIAL.
    PERFORM display_configuration_marc.
  ELSE.
    PERFORM select_configuration.
  ENDIF.

AT USER-COMMAND.
  CASE sy-ucomm.
    WHEN 'PRIN'.
      NEW-PAGE PRINT ON NEW-SECTION LINE-COUNT 65.
      printing = 'X'.
      PERFORM show_result.
      CLEAR printing.
    WHEN OTHERS.
      LEAVE.
  ENDCASE.

*---------------------------------------------------------------------*
*       FORM TYPES_LIST_WITH_CONFIG                                   *
*---------------------------------------------------------------------*
FORM types_list_with_config.

  DATA:
    xlen LIKE sy-fdpos.

  FORMAT COLOR COL_NORMAL INTENSIFIED OFF.

  NEW-PAGE.
  SORT xpgmi BY nrmit werks wemit.
  LOOP AT xpgmi.
    CLEAR object_done.
    RESERVE 8 LINES.
    object_found = x.
    READ TABLE xmakt WITH KEY xpgmi-nrmit.

    FORMAT COLOR COL_BACKGROUND INTENSIFIED OFF.

    xlen = STRLEN( text-005 ) + 3.
    WRITE: /2 text-005    COLOR COL_BACKGROUND INTENSIFIED ON.
    POSITION xlen.
    WRITE:    xpgmi-nrmit COLOR COL_BACKGROUND INTENSIFIED OFF,
              xmakt-maktx COLOR COL_BACKGROUND INTENSIFIED OFF.
    WRITE: /2 text-006    COLOR COL_BACKGROUND INTENSIFIED ON.
    POSITION xlen.
    WRITE:    xpgmi-wemit COLOR COL_BACKGROUND INTENSIFIED OFF.
    SKIP 1.

    PERFORM print_box.
    object_done = 'X'.

    FORMAT COLOR COL_NORMAL INTENSIFIED OFF.

    PERFORM get_all_configuration_data TABLES configuration.
    LOOP AT configuration.
      PERFORM check_bottom_of_page.
      PERFORM set_margins.
      POSITION 2.
      WRITE: configuration-atbez.
      xposition = len_atbez + 3.
      POSITION xposition.
      WRITE: configuration-atwtb.
    ENDLOOP.
    IF sy-subrc IS INITIAL.
      PERFORM set_uline_p.
    ENDIF.
  ENDLOOP.

  IF sy-subrc IS INITIAL.
    PERFORM set_uline_p.
  ELSE.
    IF pm_slmod IS INITIAL.
    ELSE.
      FORMAT COLOR COL_NEGATIVE.
      WRITE : /1 sy-vline.
      ytext = text-003.
      xposition = frame_size - 2.
      ASSIGN ytext(xposition) TO <ytext>.
      POSITION 2.
      WRITE <ytext>.
      POSITION frame_size.
      WRITE sy-vline.
      PERFORM set_uline_p.
    ENDIF.
  ENDIF.
ENDFORM.                    "types_list_with_config

*---------------------------------------------------------------------*
*       FORM TYPES_LIST                                               *
*---------------------------------------------------------------------*
FORM types_list.

  FORMAT COLOR COL_NORMAL INTENSIFIED OFF.

  NEW-PAGE.

  SORT xpgmi BY nrmit werks wemit.
  LOOP AT xpgmi.
    PERFORM check_bottom_of_page.
    object_found = x.
    READ TABLE xmakt WITH KEY xpgmi-nrmit.
    PERFORM set_margins.
    POSITION 2.
    IF pm_slmod IS INITIAL.
      WRITE xpgmi-nrmit COLOR COL_KEY HOTSPOT ON.
    ELSE.
      WRITE xpgmi-nrmit COLOR COL_KEY.
    ENDIF.
    xposition = len_matnr + 3.
    POSITION xposition.
    IF pm_slmod IS INITIAL.
      WRITE xpgmi-wemit COLOR COL_KEY HOTSPOT ON.
    ELSE.
      WRITE xpgmi-wemit COLOR COL_KEY.
    ENDIF.
    xposition = xposition + len_werks + 1.
    POSITION xposition.
    WRITE xmakt-maktx COLOR COL_NORMAL.
    HIDE : xpgmi.
  ENDLOOP.

  IF sy-subrc IS INITIAL.
    PERFORM set_uline_p.
  ELSE.
    IF pm_slmod IS INITIAL.
    ELSE.
      FORMAT COLOR COL_NEGATIVE.
      WRITE : /1 sy-vline.
      ytext = text-003.
      xposition = frame_size - 2.
      ASSIGN ytext(xposition) TO <ytext>.
      POSITION 2.
      WRITE <ytext>.
      POSITION frame_size.
      WRITE sy-vline.
      PERFORM set_uline_p.
    ENDIF.
  ENDIF.
ENDFORM.                    "types_list

*---------------------------------------------------------------------*
*       FORM HEADER_PREPARE                                           *
*---------------------------------------------------------------------*
FORM header_prepare.
  PERFORM cf_material_read_mava.
ENDFORM.                    "header_prepare

*---------------------------------------------------------------------*
*       FORM TYPES_PREPARE                                            *
*---------------------------------------------------------------------*
FORM types_prepare.
  CLEAR xmakt.
  SORT xpgmi BY nrmit werks wemit.
  LOOP AT xpgmi.
    READ TABLE xmakt WITH KEY xpgmi-nrmit BINARY SEARCH.
    CASE sy-subrc.
      WHEN 4.
        xmakt-matnr = xpgmi-nrmit.
        INSERT xmakt INDEX sy-tabix.
      WHEN 8.
        xmakt-matnr = xpgmi-nrmit.
        APPEND xmakt.
    ENDCASE.
  ENDLOOP.
  LOOP AT xmakt.
    PERFORM cf_material_read_ma00.
    xmakt-maktx = makt-maktx.
    MODIFY xmakt.
  ENDLOOP.
ENDFORM.                    "types_prepare

*---------------------------------------------------------------------*
*       FORM TYPES_SELECT                                             *
*---------------------------------------------------------------------*
FORM types_select.
  CLEAR object_found.
  IF pm_werks IS INITIAL.
    SELECT * FROM pgmi WHERE pgtyp = pgtyp_s
                         AND prgrp = pm_stdpd.
      xpgmi-nrmit = pgmi-nrmit.
      xpgmi-wemit = pgmi-wemit.
      xpgmi-werks = pgmi-werks.
      APPEND xpgmi.
    ENDSELECT.
  ELSE.
    SELECT * FROM pgmi WHERE pgtyp = pgtyp_s
                         AND prgrp = pm_stdpd
                         AND werks = pm_werks.
      xpgmi-nrmit = pgmi-nrmit.
      xpgmi-wemit = pgmi-wemit.
      xpgmi-werks = pgmi-werks.
      APPEND xpgmi.
    ENDSELECT.
    SELECT * FROM pgmi WHERE pgtyp = pgtyp_s
                         AND prgrp = pm_stdpd
                         AND werks = space.
      xpgmi-nrmit = pgmi-nrmit.
      xpgmi-wemit = pgmi-wemit.
      xpgmi-werks = pgmi-werks.
      APPEND xpgmi.
    ENDSELECT.
  ENDIF.
ENDFORM.                    "types_select

*---------------------------------------------------------------------*
*       FORM CF_MATERIAL_READ_MA00                                    *
*---------------------------------------------------------------------*
FORM cf_material_read_ma00.
  CLEAR mtcom.
  mtcom-kenng = mtcom_kenng_makt.
  mtcom-matnr = xmakt-matnr.
  mtcom-spras = sy-langu.

  CALL FUNCTION 'MATERIAL_READ_MA00'
    EXPORTING
      schluessel         = mtcom
    IMPORTING
      matdaten           = makt
    TABLES
      seqmat01           = xxx
    EXCEPTIONS
      material_not_found = 4.

  IF sy-subrc <> 0.
    MESSAGE e703 WITH xmakt-matnr.
*   Todavía no se ha creado el artículo &
  ENDIF.
ENDFORM.                    "cf_material_read_ma00

*---------------------------------------------------------------------*
*       FORM CF_MATERIAL_READ_MAVA                                    *
*---------------------------------------------------------------------*
FORM cf_material_read_mava.
  CLEAR mtcom.
  mtcom-kenng = mtcom_kenng_mava1.
  mtcom-matnr = pm_stdpd.
  mtcom-spras = sy-langu.

  CALL FUNCTION 'MATERIAL_READ_MAVA'
    EXPORTING
      schluessel         = mtcom
    IMPORTING
      matdaten           = mava1
    TABLES
      seqmat01           = xxx
    EXCEPTIONS
      material_not_found = 4.

  IF sy-subrc <> 0.
    MESSAGE e703 WITH pm_stdpd.
*   Todavía no se ha creado el artículo &.
  ENDIF.
  IF mava1-kzkfg IS INITIAL.
    MESSAGE e704 WITH pm_stdpd.
*   No está previsto el artículo & para la configuración de variantes.
  ENDIF.
ENDFORM.                    "cf_material_read_mava

*---------------------------------------------------------------------*
*       FORM DISPLAY_CONFIGURATION_MARC.                              *
*---------------------------------------------------------------------*
*       Anzeige der Konfiguration zum Material                        *
*---------------------------------------------------------------------*
FORM display_configuration_marc.

  IF xpgmi-wemit IS INITIAL.
    SELECT SINGLE * FROM mara WHERE matnr = xpgmi-nrmit.
    marc-cuobj = mara-cuobf.
  ELSE.
    SELECT SINGLE * FROM marc WHERE matnr = xpgmi-nrmit
                                AND werks = xpgmi-wemit.
  ENDIF.

  CHECK sy-subrc = 0.

  CALL FUNCTION 'CUD0_CONFIGURATION_INITIALIZER'.

  CLEAR cincl.

  DATA: i_configuration LIKE  conf_out OCCURS 0 WITH HEADER LINE.
  DATA: i_configuration_idoc LIKE  api_value OCCURS 0 WITH HEADER LINE.
  DATA: i_mill_se_conf_no_idoc LIKE  conf_out OCCURS 0 WITH HEADER LINE.



  CALL FUNCTION 'VC_I_GET_CONFIGURATION'
    EXPORTING
      instance             = marc-cuobj
    TABLES
      configuration        = i_configuration
      configuration_idoc   = i_configuration_idoc
      mill_se_conf_no_idoc = i_mill_se_conf_no_idoc.
  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_configuration_marc

*---------------------------------------------------------------------*
*       FORM SELECT_CONFIGURATION                                     *
*---------------------------------------------------------------------*
FORM select_configuration.
  IF xpgmi-wemit IS INITIAL.
    SELECT SINGLE * FROM mara WHERE matnr = xpgmi-nrmit.
    CHECK sy-subrc = 0.
    SET PARAMETER ID param_cux FIELD mara-cuobf.
  ELSE.
    SELECT SINGLE * FROM marc WHERE matnr = xpgmi-nrmit
                                AND werks = xpgmi-wemit.
    CHECK sy-subrc = 0.
    SET PARAMETER ID param_cux FIELD marc-cuobj.
  ENDIF.
  LEAVE.
ENDFORM.                    "select_configuration

*---------------------------------------------------------------------*
*       FORM SET_ULINE_H                                              *
*---------------------------------------------------------------------*
FORM set_uline_h.
  ASSIGN sy-uline(frame_size) TO <xtext>.
  WRITE <xtext>.
ENDFORM.                    "set_uline_h

*---------------------------------------------------------------------*
*       FORM SET_ULINE_P                                              *
*---------------------------------------------------------------------*
FORM set_uline_p.
  ASSIGN sy-uline(frame_size) TO <ytext>.
  WRITE <ytext>.
ENDFORM.                    "set_uline_p

*---------------------------------------------------------------------*
*       FORM SET_MARGINS                                              *
*---------------------------------------------------------------------*
FORM set_margins.

  IF pm_confg IS INITIAL.
    WRITE : /1 sy-vline.
    xposition = len_matnr + 2.
    POSITION xposition.
    WRITE sy-vline.
    xposition = xposition + len_werks + 1.
    POSITION xposition.
    WRITE sy-vline.
    POSITION frame_size.
    WRITE sy-vline.
  ELSE.
    WRITE : /1 sy-vline.
    xposition = len_atbez + 2.
    POSITION xposition.
    WRITE sy-vline.
    POSITION frame_size.
    WRITE sy-vline.
  ENDIF.

ENDFORM.                    "set_margins

*----------------------------------------------------------------------*
* print the header of each page                                        *
*----------------------------------------------------------------------*
FORM print_header.

  DATA:
    xlen LIKE sy-fdpos,
    pagno(10) TYPE c.

  FORMAT COLOR COL_BACKGROUND INTENSIFIED ON.

  pagno = sy-pagno.
  SHIFT pagno LEFT DELETING LEADING ' '.

  WRITE: /2 text-001.
  IF NOT ( printing IS INITIAL ).
    WRITE: 59 text-004, pagno, 70 sy-datum.
  ENDIF.

  SKIP 1.

  WRITE: /2 text-002    COLOR COL_BACKGROUND INTENSIFIED ON,
            pm_stdpd    COLOR COL_BACKGROUND INTENSIFIED OFF,
            mava1-maktx COLOR COL_BACKGROUND INTENSIFIED OFF.
  SKIP 1.

  IF NOT ( pm_confg IS INITIAL ).
    CHECK NOT ( object_done IS INITIAL ).
    xlen = STRLEN( text-005 ) + 3.
    WRITE: /2 text-005    COLOR COL_BACKGROUND INTENSIFIED ON.
    POSITION xlen.
    WRITE:    xpgmi-nrmit COLOR COL_BACKGROUND INTENSIFIED OFF,
              xmakt-maktx COLOR COL_BACKGROUND INTENSIFIED OFF.
    WRITE: /2 text-006    COLOR COL_BACKGROUND INTENSIFIED ON.
    POSITION xlen.
    WRITE:    xpgmi-wemit COLOR COL_BACKGROUND INTENSIFIED OFF.
    SKIP 1.
  ENDIF.

  PERFORM print_box.

ENDFORM.                    "print_header

*----------------------------------------------------------------------*
* print box                                                            *
*----------------------------------------------------------------------*
FORM print_box.

  FORMAT COLOR COL_HEADING INTENSIFIED ON.

  PERFORM set_uline_h.
  CHECK NOT ( object_found IS INITIAL ).
  PERFORM set_margins.

  IF pm_confg IS INITIAL.
    xtext = text-101.
    ASSIGN xtext(len_matnr) TO <xtext>.
    POSITION 2.
    WRITE <xtext> COLOR COL_HEADING INVERSE OFF.

    xtext = text-102.
    ASSIGN xtext(len_werks) TO <xtext>.
    xposition = len_matnr + 3.
    POSITION xposition.
    WRITE <xtext> COLOR COL_HEADING INVERSE OFF.

    xtext = text-103.
    ASSIGN xtext(len_maktx) TO <xtext>.
    xposition = xposition + len_werks + 1.
    POSITION xposition.
    WRITE <xtext> COLOR COL_HEADING INVERSE OFF.
  ELSE.
    xtext = text-111.
    ASSIGN xtext(30) TO <xtext>.
    POSITION 2.
    WRITE <xtext> COLOR COL_HEADING INVERSE OFF.

    xtext = text-112.
    ASSIGN xtext(30) TO <xtext>.
    xposition = len_atbez + 3.
    POSITION xposition.
    WRITE <xtext> COLOR COL_HEADING INVERSE OFF.
  ENDIF.

  PERFORM set_uline_h.

  FORMAT COLOR COL_NORMAL INTENSIFIED OFF.

ENDFORM.                    "print_box

*----------------------------------------------------------------------*
* check for bottom of page                                             *
*----------------------------------------------------------------------*
FORM check_bottom_of_page.

  DATA:
    row TYPE i.

  row = sy-linno + 1.
  IF row EQ sy-linct.
    PERFORM set_uline_p.
  ENDIF.

ENDFORM.                    "check_bottom_of_page

*----------------------------------------------------------------------*
* get all configuration data                                           *
*----------------------------------------------------------------------*
FORM get_all_configuration_data
     TABLES configuration STRUCTURE conf_out.

  DATA:
    instance LIKE inob-cuobj.

  CLEAR configuration. REFRESH configuration.

  IF xpgmi-wemit IS INITIAL.
    SELECT SINGLE * FROM mara WHERE matnr = xpgmi-nrmit.
    CHECK sy-subrc = 0.
    instance = mara-cuobf.
  ELSE.
    SELECT SINGLE * FROM marc WHERE matnr = xpgmi-nrmit
                                AND werks = xpgmi-wemit.
    CHECK sy-subrc = 0.
    instance = marc-cuobj.
  ENDIF.

  CALL FUNCTION 'VC_I_GET_CONFIGURATION'
    EXPORTING
      instance           = instance
    TABLES
      configuration      = configuration
    EXCEPTIONS
      instance_not_found = 0.

ENDFORM.                    "get_all_configuration_data

*----------------------------------------------------------------------*
* show result                                                          *
*----------------------------------------------------------------------*
FORM show_result.

  IF pm_confg IS INITIAL.
    PERFORM types_list.
  ELSE.
    PERFORM types_list_with_config.
  ENDIF.

ENDFORM.                    "show_result


19
Reports / Crear Ordenes de Trasporte para una Tabla del Tipo Transparente
« en: 08 de Agosto de 2009, 09:34:44 am »
Este Reporte sirve para transportar tablas transparentes, es util a la hora de querer migrar datos de tablas "Z" o SAP desde
un mandante a otro...Este ejemplo genera una Orden de Transporte por Tabla.

*----------------------------------------------------------------------*
* REPORT   : Y_TRANSPORTE_TABLAS
* OBJETIVO : CREAR ORDENES DE TRANSPORTE DADO UNA TABLA DEL TIPO
*            TRANSPARENTE SELECCIONADA POR PANTALLA.
*----------------------------------------------------------------------*
*
REPORT Y_TRANSPORTE_TABLAS.
*
*----------------------------------------------------------------------*
* DECLARACION DE TABLAS
*----------------------------------------------------------------------*
TABLES : dd02l.
*----------------------------------------------------------------------*
* SELECCION DE PARAMETRO NOMBRE_TABLA POR PANTALLA
*----------------------------------------------------------------------*
PARAMETERS : table LIKE dd02l-tabname OBLIGATORY.
*----------------------------------------------------------------------*
* DECLARACION DE VARIABLES
*----------------------------------------------------------------------*
DATA : w_tabclass     LIKE dd02l-tabclass,
       w_desc_orden   LIKE e07t-as4text,
       w_nume_orden   LIKE e070-trkorr,
       wa_e070        LIKE e070,
       wa_e07t        LIKE e07t,
       wa_e070c       LIKE e070c,
       tbi_e071       LIKE e071  OCCURS 1 WITH HEADER LINE,
       tbi_e071k      LIKE e071k OCCURS 1 WITH HEADER LINE.

*----------------------------------------------------------------------*
* START-OF-SELECTION
*----------------------------------------------------------------------*
START-OF-SELECTION.
*
* ---------------------------------------------------------------------*
*  Validar que la Tabla exista y que sea del tipo Transparente
* ---------------------------------------------------------------------*
*
  CLEAR : w_tabclass.
  SELECT SINGLE tabclass INTO w_tabclass FROM  dd02l
         WHERE  tabname   EQ table
         AND    as4local  EQ 'A'.
  IF ( sy-subrc NE 0 ).
    MESSAGE w208(00) WITH 'Tabla No Existe..'(e01).
    LEAVE PROGRAM.
  ELSEIF ( w_tabclass NE 'TRANSP' ).
    MESSAGE w208(00) WITH 'No es Tabla Transparente'(e05).
    LEAVE PROGRAM.
  ENDIF.
*
* ---------------------------------------------------------------------*
*  Agregar Datos de la Orden de Transporte a Tablas Internas
* ---------------------------------------------------------------------*
*
  CONCATENATE 'TRANSPORTE DE TABLA : ('
              table ') DESDE MANDANTE :' sy-mandt
         INTO w_desc_orden SEPARATED BY space.
*
  tbi_e071-pgmid        = 'R3TR'.
  tbi_e071-object       = 'TABU'.
  tbi_e071-obj_name     = table.
  tbi_e071-objfunc      = 'K'.
  APPEND tbi_e071.
*
  tbi_e071k-pgmid       = 'R3TR'.
  tbi_e071k-object      = 'TABU'.
  tbi_e071k-objname     = table.
  tbi_e071k-mastertype  = 'TABU'.
  tbi_e071k-mastername  = table.
*
  IF ( dd02l-clidep EQ 'X' ).
    CONCATENATE sy-mandt '*' INTO tbi_e071k-tabkey.
  ELSE.
    tbi_e071k-tabkey = '*'.
  ENDIF.
*
  APPEND tbi_e071k.
*
* ---------------------------------------------------------------------*
*  Crea una Nueva Orden de Transporte con la Tabla Seleccionada
* ---------------------------------------------------------------------*
*
  CALL FUNCTION 'TRINT_INSERT_NEW_COMM'
    EXPORTING
      wi_kurztext       = w_desc_orden
      wi_trfunction     = 'K'
      iv_username       = sy-uname
    IMPORTING
      we_trkorr         = w_nume_orden
      we_e070           = wa_e070
      we_e07t           = wa_e07t
      we_e070c          = wa_e070c
    EXCEPTIONS
      no_systemname     = 1
      no_systemtype     = 2
      no_authorization  = 3
      db_access_error   = 4
      file_access_error = 5
      enqueue_error     = 6
      number_range_full = 7
      invalid_input     = 8
      OTHERS            = 9.
*
  IF sy-subrc IS INITIAL.
*
    CALL FUNCTION 'TRINT_MODIFY_COMM'
      EXPORTING
        wi_e070                        = wa_e070
        wi_e07t                        = wa_e07t
        wi_e070c                       = wa_e070c
        wi_sel_e071                    = 'X'
        wi_sel_e071k                   = 'X'
        iv_no_namespace_check          = 'X'
      TABLES
        wt_e071                        = tbi_e071
        wt_e071k                       = tbi_e071k
      EXCEPTIONS
        chosen_project_closed          = 1
        e070_insert_error              = 2
        e070_update_error              = 3
        e071k_insert_error             = 4
        e071k_update_error             = 5
        e071_insert_error              = 6
        e071_update_error              = 7
        e07t_insert_error              = 8
        e07t_update_error              = 9
        e070c_insert_error             = 10
        e070c_update_error             = 11
        locked_entries                 = 12
        locked_object_not_deleted      = 13
        ordername_forbidden            = 14
        order_change_but_locked_object = 15
        order_released                 = 16
        order_user_locked              = 17
        tr_check_keysyntax_error       = 18
        no_authorization               = 19
        wrong_client                   = 20
        unallowed_source_client        = 21
        unallowed_user                 = 22
        unallowed_trfunction           = 23
        unallowed_trstatus             = 24
        no_systemname                  = 25
        no_systemtype                  = 26
        OTHERS                         = 27.
*
    IF ( sy-subrc EQ 0 ).
      MESSAGE i368(00) WITH 'Nueva Orden Creada : '(e02) w_nume_orden.
    ELSE.
      MESSAGE e368(00) WITH
        'TRINT_MODIFY_COMM Error : '(e03) sy-subrc.
    ENDIF.
  ELSE.
    MESSAGE e368(00) WITH
      'TRINT_INSERT_NEW_COMM Error : '(e04) sy-subrc.
  ENDIF.
*----------------------------------------------------------------------*

20
Varios / Algunos Reportes Estandar SAP de Utilidad
« en: 03 de Noviembre de 2007, 11:19:33 am »
REKH0004   SAP demo program that shows how to do 2D, 3D, and 4D graphics.
RGUGBR00   Substitution/Validation utility
RHGENZ0/HRGRENZ2    Notes
RHGRENZ0/2    will abend if there are any inconsistencies between PD and PA (i.e. people in a differentcontrolling area than the     position they belong to).
RHGRENZ0   Delimit IT1000 and related 1001s. Program will delete any 1001 infotypes whose start date is after the delimit    date.
RHGRENZ1   Extend the end date on delimited records. Very useful when you delimit a bunch of records incorrectly, and need    to change the end date.
RHGRENZ2   Delimit IT1001 only.
RKCTSEAR   Search source code for up to two strings. Also see RSRSCAN1 and RPR_ABAP_SOURCE_SCAN.
RPDTRA00   List all HR transactions.
RPR_ABAP_SOURCE_SCAN   Search ABAP code for a string. Has many more options for selecting the ABAPs to search than RSRSCAN1 or    RKCTSEAR.
RPUAUD00   HR Report to list all logged changes for an employee. Uses the PCL4 Audit Cluster.
RPUAUDDL   HR Report to delete audit data from the PCL4 Audit Cluster.
RPUDELPN   Delete all info for an employee number, including cluster data and infotypes
RPUP1D00/10   View/Delete data from PCL1 Cluster
RPUP2D00/10   View/Delete data from PCL2 Cluster
RPUP3D00/10   View/Delete data from PCL3 Cluster
RPUP4D00/10   View/Delete data from PCL4 Cluster
RSABAPIV   Mass print/display of ABAP/4 help text
RSAVGL00   Table adjustment across clients
RSBDCBTC   Submit a BDC job with an internal batch number and wait for the end of the batch input session.
RSBDCDRU   Prints the contents of a Batch Input session. No options for error transactions only.
RSBDCOS0   Execute UNIX commands. Looks similar to the old SAPMSOS0 program that disappeared in 3.0
RSBDCSUB   Release batch input sessions automatically
RSBTCDEL   Clean the old background job records
RSCLTCOP   Copy tables across clients
RSDBCREO   Clean batch input session log
RSINCL00   Extended program list
RSORAREL   Get the Oracle Release
RSPARAM   Display all instance parameters
RSPO0041   Removing old spooling objects
RSRSCAN1   Search source code for a given string. Will also search includes. Also see RKCTSEAR and    RPR_ABAP_SOURCE_SCAN.
RSSNAPDL   Clean the old ABAP error dumps
RSTBSERV   Compare a contents of a table between clients
RSTXFCON   Converts SAPScript page formats
RSTXSCRP   Save a SAPScript layout set to disk, and load it back into SAP.
RSTXSCRP   Transport SAPscript files across systems
RSTXSCRP   Upload and download SAPScript layout sets
RSTXTPDF4   Pass the spool number of a report's output to this program to have the output converted to PDF format.
RSTXTRAN   Add standard texts to a transport so they can be moved between systems.
RSUSR003   Check the passwords of users SAP* and DDIC in all clients
RSUSR006   List users last login
RSWBO052   Change development class of a sapscript (provided by Alan Cecchini)
RSWBO060   put objects into a request and transport it to any other system

21
Varios / Transacciones Utiles por Modulo
« en: 03 de Noviembre de 2007, 11:17:50 am »
Plant Maintenance (PM)
   
IW32   Change Plant Maintenance Order
IW33   Display Plant Maintenance Order
IW34   Create Notification Order
IW51   Create Service Notification
IW52   Change Service Notification
IW53   Display Service Notification
IW54   Create Service Notification :Problem notification
IW55   Create Service Notification :Activity Request
IW56   Create Service Notification :Service Request
IW57   Assign deletion Flag to Completed Service Notifications
IW58   Change Service Notifications: Selection of Notification
IW59   Display Service Notifications: Selection of Notification

Production Planning

C001   Create Production Order
C005N   Collective Release
C011N   Time Ticket
C012   Confirmation - Collective
C013   Confirmation - Cancel
C00IS   Production order information system
C0GI   Reprocess Goods Movements
C223   Maintain production version

General Notes
You can execute the following commands in the transaction code (tcode) field with Enter. You will find some useful transaction codes below to work in tandem with the following commands:   
To call a transaction - In the same session (window) Enter: /nxxxx (xxxx = transaction code). - In an additional session, Enter: /oxxxx (xxxx = transaction code).   
If you enter this function before any of the tcodes below, you are able to break out of your current screen/business and begin a completely new session. Otherwise, the current business process has to be terminated, and return to the initial user screen (the main menu) has to be initiated before entering tcode spro). /o tcode saves you the effort of having to do this.   
To end the current transaction Enter: /n. Caution: Unsaved changes are lost without warning   
To delete the current session. Enter: /i.   
To generate a session list Enter: /o.   
To log off from the system Enter: /nend.   
From John O'Meara   
OSS Note 0026171 has additional information on OKCodes in SAP, and is a very useful read   

BASIS/ABAP

USMM   Pressing F8 will display all hotpacks applied.
SEARCH_SAP_MENU   Show the menu path to use to execute a given tcode. You can search by transaction code or menu text.
DI02   ABAP/4 Repository Information System: Tables.
LSMW   Legacy System Migration Workbench. An addon available from SAP that can make data converstion a lot    easier.  Thanks to Serge Desland for this one.
OSS1   SAP Online Service System
OY19   Compare Tables
SM13   Update monitor. Will show update tasks status. Very useful to determine why an update failed.
S001   ABAP Development Workbench
S001   ABAP/4 Development Weorkbench. (from john.omeara@syskoplan.ie)
S002   System Administration. (from john.omeara@syskoplan.ie)
SA38   Execute a program. (from john.omeara@syskoplan.ie)
SCAT   Computer Aided Test Tool
SCU0   Compare Tables
SE01   Old Transport & Corrections screen
SE03   Groups together most of the tools that you need for doing transports. In total, more than 20 tools can be
   reached from this one transaction.
SE09   Workbench Organizer
SE10   New Transport & Correction screen
SE11   ABAP/4 Dictionary Maintenance SE12 ABAP/4 Dictionary Display SE13 Maintain Technical Settings (Tables)
SE12   Dictionary: Initial Screen - enter object name. (from john.omeara@syskoplan.ie)
SE13   Access tables in ABAP/4 Dictionary. (from john.omeara@syskoplan.ie)
SE14   Utilities for Dictionary Tables
SE15   ABAP/4 Repository Information System
SE16   Data Browser: Initial Screen. (from john.omeara@syskoplan.ie)
SE16N   Table Browser (the N stands for New, it replaces SE16). Provided by Smijo Mathew.
SE17   General Table Display
SE24   Class Builder
SE30   ABAP/4 Runtime Analysis
SE32   ABAP/4 Text Element Maintenance
SE35   ABAP/4 Dialog Modules
SE36   ABAP/4: Logical Databases
SE37   ABAP/4 Function Modules
SE38   ABAP Editor
SE39   Splitscreen Editor: Program Compare
SE41   Menu Painter
SE43   Maintain Area Menu
SE48   Show program call hierarchy. Very useful to see the overall structure of a program. Thanks to Isabelle Arickx    for this tcode.
SE49   Table manipulation. Show what tables are behind a transaction code. Thanks to Isabelle Arickx for this    tcode.
SE51   Screen Painter: Initial Screen. (from john.omeara@syskoplan.ie)
SE54   Generate View Maintenance Module
SE61   R/3 Documentation
SE62   Industry utilities
SE63   Translation
SE64   Terminology
SE65   R/3 document. short text statistics SE66 R/3 Documentation Statistics (Test!)
SE68   Translation Administration
SE71   SAPscript layout set
SE71   SAPScript Layouts Create/Change
SE72   SAPscript styles
SE73   SAPscript font maintenance (revised)
SE74   SAPscript format conversion
SE75   SAPscript Settings
SE76   SAPscript Translation Layout Sets
SE77   SAPscript Translation Styles
SE80   ABAP/4 Development Workbench
SE81   SAP Application Hierarchy
SE82   Customer Application Hierarchy
SE83   Reuse Library. Provided by Smiho Mathew.
SE84   ABAP/4 Repository Information System
SE85   ABAP/4 Dictionary Information System
SE86   ABAP/4 Repository Information System
SE87   Data Modeler Information System
SE88   Development Coordination Info System
SE91   Maintain Messages
SE92   Maintain system log messages
SE93   Maintain Transaction. (from john.omeara@syskoplan.ie)
SEARCH_SAP_MENU   From the SAP Easy Access screen, type it in the command field and you will be able to search the standard
    SAP menu for transaction codes / keywords. It will return the nodes to follow for you.
SEU   Object Browser
SHD0   Transaction variant maintenance
SM04   Overview of Users (cancel/delete sessions)
SM12   Lock table entries (unlock locked tables)
SM21   View the system log, very useful when you get a short dump. Provides much more info than short dump
SM30   Maintain Table Views. (from john.omeara@syskoplan.ie)
SM31   Table Maintenance
SM32   Table maintenance
SM35   View Batch Input Sessions
SM37   View background jobs
SM50   Process Overview. (from john.omeara@syskoplan.ie)
SM51   Delete jobs from system (BDC)
SM62   Display/Maintain events in SAP, also use function BP_EVENT_RAISE
SMEN   Display the menu path to get to a transaction
SMOD/CMOD   Transactions for processing/editing/activating new customer enhancements.
SNRO   Object browser for number range maintenance. (from john.omeara@syskoplan.ie)
SPRO   Start SAP IMG (Implementation Guide). (from john.omeara@syskoplan.ie)
SQ00   ABAP/4 Query: Start Queries
SQ01   ABAP/4 Query: Maintain Queries
SQ02   ABAP/4 Query: Maintain Funct. Areas
SQ03   ABAP/4 Query: Maintain User Groups
SQ07   ABAP/4 Query: Language Comparison
ST05   Trace SQL Database Requests. (from john.omeara@syskoplan.ie)
ST22   ABAP Dump analysis
SU53   Display Authorization Values for User. (from john.omeara@syskoplan.ie)
WEDI   EDI Menu. IDOC and EDI base.
WE02   Display an IDOC
WE07   IDOC Statistics
Human Resources
PA03   Change Payroll control record
PA20   Display PA Infotypes
PA30   Create/Change PA Infotypes
PP02   Quick Entry for PD object creation
PU00   Delete PA infotypes for an employee. Will not be able to delete an infotype if there is cluster data assigned to    the employee.
   
Sales and Distribution (SD)

OLSD   Config for SD. Use Tools-Data Transfer-Conditions to setup SAP supplied BDC to load pricing data
VA01   Create Sales/Returns Order:Initial Screen
VB21   Transaction for Volume Lease Purchases (done as a sales deal)
VK15   Transaction used to enter multiple sales conditions (most will be entered here)
   
SAP Office

SO00   send a note through SAP, can be sent to internet, X400, etc
   
FI Financial Management

FGRP   Report Writer screen
FM12   View blocked documents by user
FST2   Insert language specific name for G/L account. (from john.omeara@syskoplan.ie)
FST3   Display G/L account name. (from john.omeara@syskoplan.ie)
KEA0   Maintain operating concern. (from john.omeara@syskoplan.ie)
KEKE   Activate CO-PA. (from john.omeara@syskoplan.ie)
KEKK   Assign operating concern. (from john.omeara@syskoplan.ie)
KL04   Delete activity type. (from john.omeara@syskoplan.ie)
KS04   Delete a cost centre. (from john.omeara@syskoplan.ie)
KSH2   Change cost centre group - delete. (from john.omeara@syskoplan.ie)
OBR2   Deletion program for customers, vendors, G/L accounts. (from john.omeara@syskoplan.ie)
OKC5   Cost element/cost element group deletion. (from john.omeara@syskoplan.ie)
OKE1   Delete transaction data. (from john.omeara@syskoplan.ie)
OKE2   Delete a profit centre. (from john.omeara@syskoplan.ie)
OKI1   Determine Activity Number: Activity Types (Assignment of material number/service to activity type) (from    john.omeara@syskoplan.ie)
OMZ1   Definition of partner roles. (from john.omeara@syskoplan.ie)
OMZ2   Language dependent key reassignment for partner roles. (from john.omeara@syskoplan.ie)

Material Management (MM)

MM06   Flag material for deletion. (from john.omeara@syskoplan.ie)
OLMS-   materials management configuration menu, most of the stuff under this menu is not under the    implementation guide
   
MM configuration transactions

OLMB-   Inventory management/Physical Inventory
OLMD-   MM Consumption-Based Planning
OLME-   MM Purchasing
OLML-   Warehouse Management
OLMR-   Invoice Verification
OLMS   Material Master data
OLMW-   MM Valuation/Account Assignment

Config Related

OLE   OLE demo transaction
OLI0   C Plant Maintenance Master Data
OLI1   Set Up INVCO for Material Movements
OLI8   Set Up SIS for Deliveries
OLIA   C Maintenance Processing
OLIP   C Plant Maintenance Planning
OLIQ   New set-up of QM info system
OLIX   Set Up Copying/Deleting of Versions
OLIY   Set Up Deletion of SIS/Inter.Storage
OLIZ   Stat Set Up INVCO: Invoice Verif
OLM2   Customizing: Volume-Based Rebates
OLMB   C RM-MAT Inventory Management Menu
OLMD   C RM-MAT MRP Menu
OLME   C MM Menu: Purchasing
OLML   C MM Menu for Warehouse Management
OLMR   C RM-MAT Menu: Invoice Verification
OLMS   C RM-MAT Master Data Menu
OLMW   C RM-MAT Valuation/Acct. Assgt. Menu
OLPA   SOP Configuration
OLPE   Sales order value
OLPK   Customizing for capacity planning
OLPR   Project System Options
OLPS   Customizing Basic Data
OLPV   Customizing: Std. Value Calculation
OLQB   C QM QM in Procurement
OLQI   Analysis
OLQM   Customizing QM Quality Notifications
OLQS   C QM Menu Basic Data
OLQW   C QM Inspection Management
OLQZ   Quality Certificates
OLS1   Customizing for Rebates
OLSD   Customizing: SD
OLVA   C SD Sales Menu
OLVD   C SD Shipping Menu
OLVF   C SD Billing Menu
OLVS   C SD Menu for Master Data
SPRO   Start SAP IMG

22
Reports / Ejemplo Utilizacion de Grafico
« en: 03 de Noviembre de 2007, 11:13:46 am »
REPORT Y_GRAFICO .

DATA: BEGIN OF ITAB_DATA OCCURS 0,
           DATANAME(15),
           QUANTITY1 TYPE I,
           QUANTITY2 TYPE I,
           QUANTITY3 TYPE I,
      END OF ITAB_DATA,
      BEGIN OF ITAB_OPTIONS OCCURS 0,
           OPTION(20),
      END OF ITAB_OPTIONS.

ITAB_DATA-DATANAME = 'Electricity'.
ITAB_DATA-QUANTITY1 = 55.
ITAB_DATA-QUANTITY2 = 62.
ITAB_DATA-QUANTITY3 = 59.
APPEND ITAB_DATA.

ITAB_DATA-DATANAME = 'Gas'.
ITAB_DATA-QUANTITY1 = 35.
ITAB_DATA-QUANTITY2 = 52.
ITAB_DATA-QUANTITY3 = 44.
APPEND ITAB_DATA.

ITAB_DATA-DATANAME = 'Water'.
ITAB_DATA-QUANTITY1 = 18.
ITAB_DATA-QUANTITY2 = 22.
ITAB_DATA-QUANTITY3 = 19.
APPEND ITAB_DATA.

CALL FUNCTION 'GRAPH_MATRIX_3D'
     EXPORTING
          COL1        = 'Jan'
          COL2        = 'Feb'
          COL3        = 'Mar'
          TITL        = 'Utility Expenses in US$.'
     TABLES
          DATA        = ITAB_DATA
          OPTS        = ITAB_OPTIONS
     EXCEPTIONS
          OTHERS      = 1.

23
Varios / Transacciones Utiles en ABAP
« en: 03 de Noviembre de 2007, 11:03:45 am »
CAM CATT Management
SCAT Computer Aided Test Tool
SE09 Workbench Organizer
SE10 Customizing Organizer
SE11 ABAP/4 Dictionary Maintenance
SE12 ABAP/4 Dictionary Display
SE13 Maintain Technical Settings (Tables)
SE14 Utilities for Dictionary Tables
SE15 ABAP/4 Repository Information System
SE16 Data Browser
SE17 General Table Display
SE30 ABAP/4 Runtime Analysis
SE32 ABAP/4 Text Element Maintenance
SE35 ABAP/4 Dialog Modules
SE36 ABAP/4: Logical Databases
SE37 ABAP/4 Function Modules
SE38 ABAP/4 Program Development
SE39 Splitscreen Editor: Program Compare
SE41 Menu Painter
SE43 Maintain Area Menu
SE51 Screen Painter
SE54 Generate View Maintenance Module
SE61 R/3 Documentation
SE62 Industry utilities
SE63 Translation
SE64 Terminology
SE65 R/3 document. short text statistics
SE66 R/3 Documentation Statistics (Test!)
SE68 Translation Administration
SE71 SAPscript layout set
SE72 SAPscript styles
SE73 SAPscript font maintenance (revised)
SE74 SAPscript format conversion
SE75 SAPscript Settings
SE76 SAPscript Translation Layout Sets
SE77 SAPscript Translation Styles
SE80 ABAP/4 Development Workbench
SE81 SAP Application Hierarchy
SE82 Customer Application Hierarchy
SE84 ABAP/4 Repository Information System
SE85 ABAP/4 Dictionary Information System
SE86 ABAP/4 Repository Information System
SE87 Data Modeler Information System
SE88 Development Coordination Info System
SE91 Maintain Messages
SE92 Maintain system log messages
SE93 Maintain Transaction Codes
SEU Object Browser
SHD0 Transaction variant maintenance
SQ00 ABAP/4 Query: Start Queries
SQ01 ABAP/4 Query: Maintain Queries
SQ02 ABAP/4 Query: Maintain Funct. Areas
SQ03 ABAP/4 Query: Maintain User Groups
SQ07 ABAP/4 Query: Language Comparison

24
Varios / Tablas Modulo PP
« en: 03 de Noviembre de 2007, 11:00:03 am »
MAST   Material BOM
STKO   BOM Header
STPO   BOM Positions (detail)
MAPL   Assignment fo Task Lists to Materials
PLKO   Routing Group Header
PLSO   Routing Group Sequence
PLPO   Routing Group Operations
AFKO   Production Order Header
AFPO   Production Order Position (details)

25
Varios / Tablas Modulo PS
« en: 03 de Noviembre de 2007, 10:59:28 am »
IMAK   Appropriation requests - general data
IMAV   Appropriation request variant
IMPR   Investment Program Positions
IMPU   Texts for cap. inv. program positions
IMTP   Investment programs
IMZO   Assignment Table- CO Object - Capital Investment Prog.Pos.
PMCO   Cost structure of maintenance order
PRHI   Work Breakdown Structure, Edges (Hierarchy Pointer)
PROJ   Project definition
PRPS   WBS (Work Breakdown Structure) Element Master Data

26
Varios / Tablas Modulo HR / Infotipos
« en: 03 de Noviembre de 2007, 10:58:55 am »
CATSCO   Cross-Application Time Sheet (CATS)- Transfer to CO
CATSDB   CATS- Database Table for Time Sheet
CATSHR   Cross-Application Time Sheet (CATS)- Transfer to HR
CATSMM   Cross-Application Time Sheet (CATS)- Transfer to MM
CATSPM   Cross-Application Time Sheet (CATS)- Transfer to PM/CS
CATSPS   Cross-Application Time Sheet (CATS)- Transfer to PS
CSKS   Cost Center Master Data
CSKT   Cost Center Texts
PCL1   HR Cluster 1
PCL2   HR Cluster 2
T001P   Personnel Area/Subarea
T001T   Company code-dependent texts
T500L   Personnel Country Grouping
T500P   Personnel Areas
T502T   Marital Status Designators
T503   Employee Group/Subgroup
T503T   Employee Subgroup Names
T508A   Work Schedule Rules
T510   Pay Scale Groups
T510A   Pay Scale Types
T510F   Assign Pay Scale --- Currency
T510W   Pay Scale - Period Parameter Assignment
T511   Wage Types
T512T   Wage Type Texts
T512W   Wage Type Valuation
T512Z   Permissibility of Wage Types per Infotype
T527X   Organizational Units
T528T   Position Texts
T529T   Personnel Action Texts
T529U   Status Values
T530   Reasons for Actions
T530T   Reason for Action Texts
T549A   Payroll Accounting Areas
T549Q   Payroll Periods
T550A   Daily Work Schedule
T550S   Daily Work Schedule Texts
T551S   Period Work Schedule Texts
T552A   Monthly Work Schedule
T554C   Absence Valuation
T554S   Attendance and Absence Types
T554T   Attendance and Absence Texts
T558B   Payroll Account Transfer- Payroll Periods
T569V   Control Records
T5K8C   Transfer ext. payroll results into Canadian specific tables
T74FA   Benefit insurance plan
T74FC   Benefits Insurance Coverage Rule
HRP1000   Infotype 1000 DB Table (Objects)
HRP1001   Infotype 1001 DB Table (Relationships)
HRP1002   Infotype 1002 DB Table
HRP1003   Infotype 1003 DB Table
HRP1004   Infotype 1004 DB table
HRP1005   DB Table for Infotype 1005 (Planned Compensation)
HRP1006   Infotype 1006 DB table
HRP1007   Infotype 1007 DB Table
HRP1008   Infotype 1008 DB Table
HRP1009   Infotype 1009 DB table
HRP1010   Infotype 1010 DB table
HRP1011   Infotype 1011 DB Table
HRP1013   Infotype 1013 DB Table
HRP1014   Infotype 1014 DB Table
HRP1015   Infotype 1015 DB table
HRP1016   Infotype 1016 DB Table
HRP1017   Infotype 1016 DB Table
HRP1018   DB Table for Infotype 1018 Cost Distribution
HRP1019   DB Table for Infotype 1019 Required Positions
HRP1020   Infotype 1020 DB table
HRP1021   INFOTYPE 1021 DB TABLE
HRP1023   Infotype 1023 DB table
HRP1024   INFOTYPE 1024 DB TABLE
HRP1025   INFOTYPE 1025 DB TABLE
HRP1026   Infotype 1026 DB table
HRP1027   Infotype 1027 DB table
HRP1028   Infotype 1028 DB Table
HRP1029   Infotype 1029 DB table
HRP1030   Infotype 1030 DB table
HRP1031   Infotype 1031 DB table
HRP1032   Infotype 1032 DB Table
HRP1033   DB table for infotype 1033
HRP1034   Infotype 1034 DB table
HRP1035   Infotype 1035 DB Table
HRP1036   Infotype 1036 DB table
HRP1037   Infotype 1037 DB Table
HRP1038   Infotype 1038 DB table
HRP1039   Database Table for Infotype 1039
HRP1040   Database Table for Infotype 1040
HRP1041   DB Table for Infotype 1041
HRP1042   Infotype 1042 DB Table
HRP1043   DB Table for Infotype 1043
HRP1044   DB Table for Infotype 1044
HRP1045   DB Table for Infotype 1045
HRP1046   Database Table for Infotype 1046
HRP1047   DB Table for Infotype 1047
HRP1048   DB Table for Infotype 1048
HRP1049   Database Tables for Infotype 1049
HRP1050   DB Table for Infotype 1050 (Job Evaluation Results)
HRP1051   DB Table for Infotype 1051 (Survey Results)
HRP1060   DB Table for Infotype 1060
HRP1061   DB Table for Infotype 1061
HRP1062   DB Table for Infotype 1062
HRP1063   DB Table for Infotype 1063
HRP1201   Infotype 1201 DB Table
HRP1205   Infotype 1205 DB Table
HRP1206   Infotype 1206 DB Table
HRP1208   Infotype 1208 DB Table
HRP1209   Infotype 1209 DB Table
HRP1210   Infotype 1210 DB Table
HRP1211   Infotype 1211 DB Table
HRP1212   Infotype 1212 DB Table
HRP1213   Infotype 1213 DB Table
HRP1214   Infotype 1214 DB Table
HRP1215   Infotype 1215 DB Table
HRP1216   Infotype 1216 DB Table
HRP1217   Infotype 1217 DB Table
HRP1218   DB Table for Infotype 1218
HRP1220   DB Table for Infotype 1220 Activity Profile
HRP1221   DB Table for Infotype 1221 Excluded Activities
HRP1222   Infotype 1222- General attribute maintenance
HRP1230   DB Table for Infotype 1230
HRP1240   DB Table for Infotype 1240
HRP1250   DB table for infotype 1250
HRP1251   DB table for infotype 1251
HRP1252   DB table for infotype 1252
HRP1253   DB table for infotype 1253
HRP1254   DB Table for Infotype 1254
HRP1260   DB Table for Infotype 1260
HRP1270   DB Table for Info Type 1270
HRP1403   DB table for infotype 1403
HRP1404   DB table for infotype 1404
HRP1500   DB Table for Infotype 1500
HRP1501   DB Table for Infotype 1501
HRP1502   DB Table for Infotype 1502
HRP1503   DB Table for Infotype 1503
HRP1504   DB Table for Infotype 1504
HRP1505   DB Table for Infotype 1505
HRP1506   DB Table for Infotype 1506
HRP1507   DB Table for Infotype 1507
HRP1518   DB Table for Infotype 1518
HRP1519   DB Table for Infotype 1519
HRP1520   DB Table for Infotype 1520
HRP1600   Database Table for Infotype 1600
HRP1601   Database Table for Infotype 1601
HRPAD21   Additional data PAD21
HRPAD22   Additional data PAD22
HRPAD23   Additional data PAD23
HRPAD25   Additional data PAD25
HRPAD27   Additional data PAD27
HRPAD31   Additional data PAD31
HRPAD34   Additional Data for Relationship 'has attended'
HRPAD44   PAD44 Additional Data
HRPAD47   PAD47 Additional Data
HRPAD48   Additional Data PAD48
HRPAD50   Additional Data PAD50
HRPAD51   Additional data PAD51
HRPAD53   Additional Data PAD53
HRPAD63   PAD63 Additional Data
HRPAD77   Additional data for PAD77
HRPADBLIST   Additional Data Databases
HRPADD2   Additional Data PADD2
HRPADD3   Additional Data PADD3
HRPADIC   Additional Data PADD2
HRPADNLIST   Additional Data Number List
HRPADNN   General Additional Data Table
HRPADP1   Additional Data PADP1
HRPADP2   Additional Data PADP2
HRPADPM   Additional Data PADPM
HRPADTI   PADTI Additional Data
HRPADUZ   PADUZ Additional Data- Requirements Assignment of Persons
HRPADXN   Additional Data PADXN
HRPS_T012K   For Decoupled Access to T012K (House Bank and Account)
HRPVAC   List of vacant positions
HRPXXXX   DB Table for Infotype XXXX
HRPYYYY   DB Table for Infotype YYYY
PA2001   HR Time Record- Infotype 2001 (Absences)
PA2001_UGR   Generated Table for View PA2001_UGR
PA2002   HR Time Record- Infotype 2002 (Attendances)
PA2002_UGR   Generated Table for View PA2002_UGR
PA2003   HR Time Record- Infotype 2003 (Substitutions)
PA2004   HR Time Record- Infotype 2004 (Availability)
PA2005   HR Time Record- Infotype 2005 (Overtime)
PA2006   HR Time Record- Infotype 2006 (Absence Quotas)
PA2006_UGR   Generated Table for View PA2006_UGR
PA2007   HR Time Record- Infotype 2007 (Attendance Quotas)
PA2007_UGR   Generated Table for View PA2007_UGR
PA2010   HR Time Record- Infotype 2010 (Employee Remuneration Info.)
PA2012   HR Time Record- Infotype 2012 (Time Transfer Specifications)
PA2013   HR Time Record- Infotype 2013 (Quota Corrections)
PA2500   HR Master Record for Infotype 2500
PA2501   HR Master Record for Infotype 2501
PA2502   HR Master Record for Infotype 2502
PA0000   HR Master Record- Infotype 0000 (Actions)
PA0001   HR Master Record- Infotype 0001 (Org. Assignment)
PA0002   HR Master Record- Infotype 0002 (Personal Data)
PA0003   HR Master Record- Infotype 0003 (Payroll Status)
PA0004   HR Master Record- Infotype 0004 (Challenge)
PA0005   HR Master Record- Infotype 0005 (Leave Entitlement)
PA0006   HR Master Record- Infotype 0006 (Addresses)
PA0007   HR Master Record- Infotype 0007 (Planned Working Time)
PA0008   HR Master Record- Infotype 0008 (Basic Pay)
PA0009   HR Master Record- Infotype 0009 (Bank Details)
PA0010   HR Master Record- Infotype 0010 (Capital Formation)
PA0011   HR Master Record- Infotype 0011 (Ext.Bank Transfers)
PA0012   HR Master Record- Infotype 0012 (Fiscal Data - Germany)
PA0013   Infotype Social Insurance - Germany
PA0014   HR Master Record- Infotype 0014 (Recur. Payments/Deds.)
PA0015   HR Master Record- Infotype 0015 (Additional Payments)
PA0016   HR Master Record- Infotype 0016 (Contract Elements)
PA0017   HR master record- Infotype 0017 (Travel Privileges)
PA0019   HR Master Record- Infotype 0019 (Monitoring of Dates)
PA0020   HR Master Record- Infotype 0020 (DUEVO)
PA0021   HR Master Record- Infotype 0021 (Family)
PA0022   HR Master Record- Infotype 0022 (Education)
PA0023   HR Master Record- Infotype 0023 (Other/Previous Employers)
PA0024   HR Master Record- Infotype 0024 (Qualifications)
PA0025   HR Master Record- Infotype 0025 (Appraisals)
PA0026   HR Master Record- Infotype 0026 (Company Insurance)
PA0027   HR Master Record- Infotype 0027 (Cost Distribution)
PA0028   HR Master Record- Infotype 0028 (Int. Medical Service)
PA0029   HR Master Record- Infotype 0029 (Workers' Compensation)
PA0030   HR Master Record- Infotype 0030 (Powers of Attorney)
PA0031   HR Master Record- Infotype 0031 (Reference Pers.Nos.)
PA0032   HR Master Record- Infotype 0032 (Internal Data)
PA0033   International Infotype 0033- Statistics Exceptions
PA0034   HR Master Record- Infotype 0034 (Corporate Functions)
PA0035   HR Master Record- Infotype 0035 (Comp.Instr.)
PA0036   HR Master Record- Infotype 0036 (Social Insurance CH)
PA0037   HR Master Record- Infotype 0037 (Insurance)
PA0038   HR Master Record- Infotype 0038 (Fiscal Data CH)
PA0039   HR Master Record- Infotype 0039 (Add. Org. Assignment CH)
PA0040   HR Master Record- Infotype 0040 (Objects on Loan)
PA0041   HR Master Record- Infotype 0041 (Date Specifications)
PA0042   HR Master Record- Infotype 0042 (Fiscal Data - Austria)
PA0043   HR Master Record- Infotype 0043 (Family Allowance - A)
PA0044   HR Master Record- Infotype 0044 (Social Insurance - A)
PA0045   HR Master Record- Infotype 0045 (Company Loans)
PA0046   HR Master Record- Infotype 0046 (Company Pension Fund CH)
PA0048   HR Master Record- Infotype 0048 (Residence Status - CH)
PA0049   HR Master Record- Infotype 0049 (Red.Hrs./Bad Weather)
PA0050   HR Master Record- Infotype 0050 (Time Recording)
PA0051   HR Master Record- Infotype 0051 (ASB/SPI Data)
PA0052   HR Master Record- Infotype 0052 (Wage Maintenance)
PA0053   HR Master Record- Infotype 0053 (Company Pension)
PA0054   HR Master Record- Infotype 0054 (Works Council Pay)
PA0055   HR Master Record- Infotype 0055 (Previous Employer - A)
PA0056   HR Master Record- Infotype 0056 (Sick Certificates-A)
PA0057   HR Master Record- Infotype 0057 (Membership Fees)
PA0058   HR Master Record- Infotype 0058 (Commuter Rate - Austria)
PA0059   HR Master Record- Infotype 0059 (Social Insurances - NL)
PA0060   HR Master Record- Infotype 0060 (Fiscal Data - NL)
PA0061   HR Master Record- Infotype 0061 (Social Insurance - ES)
PA0062   HR master record- Infotype 0062 Fiscal data (ES)
PA0063   HR Master Record- Infotype 0063 (Social Fund - NL)
PA0064   HR Master Record- Infotype 0064 (Social Insurance - F)
PA0065   HR Master Record- Infotype 0065 (Tax - GB)
PA0066   HR Master data infotype 0066 - Canadian garnishment- order
PA0067   HR master data infotype 0067 - Canadian garnishment- debt
PA0068   HR master data infotype 0068 - Canadian garnishment- adjust
PA0069   HR Master Record- Infotype 0069 (Nat. Insurance - GB)
PA0070   HR Master Record- Infotype 0070 (Court Orders - GB)
PA0071   HR Master Record- Infotype 0071 (Pension Funds - GB)
PA0072   HR Master Record- Infotype 0072 (Fiscal Data - DK)
PA0073   HR Master Record- Infotype 0073 (Private Pensions - DK)
PA0074   HR Master Record- Infotype 0074 (Leave Processing - DK)
PA0075   HR Master Record- Infotype 0075 (ATP Pension - DK)
PA0076   HR Master Record- Infotype 0076 (Workers Compensation NA)
PA0077   HR Master Record- Infotype 0077 (Additional Personal Data)
PA0078   HR Master Record- Infotype 0078 (Loan Payments)
PA0079   Infotype SI Additional Insurance - D
PA0080   HR Master Record- Infotype 0080 (Maternity Protection)
PA0081   HR Master Record- Infotype 0081 (Military Service)
PA0082   HR Master Record- Infotype 0082 (Additional Absence Data)
PA0083   HR Master Record- Infotype 0083 (Leave Compensation)
PA0084   HR Master Record- Infotype 0084 (Sickness Pay Control - GB)
PA0085   HR Master Record- Infotype 0085 (Work Incapacity Periods GB)
PA0086   HR Master Record- Infotype 0086 (SSP/SMP Exclusions GB)
PA0087   HR Master Record- Infotype 0087 (WFTC/DPTC GB)
PA0088   HR Master Record- Infotype 0088 (SMP Record - GB)
PA0090   HR Master Record- Infotype 0090 (Additional Income)
PA0092   HR master record- Infotype 0092 Seniority (ES)
PA0093   HR Master Record- Infotype 0093 (Previous Employers - D)
PA0094   HR Master Record- Infotype 0094 (Residence Status - NA)
PA0095   HR Master Record- Infotype 0095 (Tax Canada)
PA0096   HR Master Record- Infotype 0096 (Tax - USA)
PA0098   HR Master Record- Infotype 0098 (Profit Sharing - F)
PA0100   HR Master Record- Infotype 0100 (SI B)
PA0101   HR Master Record- Infotype 0101 (Tax B)
PA0102   HR Master Record- Infotype 0102 (Grievances NA)
PA0103   HR Master Record- Infotype 0103 (Bond Purchases NA)
PA0104   HR Master Record- Infotype 0104 (Bond Denominations NA)
PA0105   HR Master Record- Infotype 0105 (Communications)
PA0106   HR Master Record- Infotype 0106 (Related Persons NA)
PA0107   HR Master Record- Infotype 0107 (Work Schedule B)
PA0108   HR Master Record- Infotype 0108 (Personal Data B)
PA0109   HR Master Record- Infotype 0109 (Contract Elements B)
PA0110   HR Master Record- Infotype 0110 (Pensions NL)
PA0111   HR Master Record- Infotype 0111 (Garnishment/Cession - D)
PA0112   HR Master Record- Infotype 0112 (Garnishment Claim - D)
PA0113   HR Master Record- Infotype 0113 (Garnish. Interest - D)
PA0114   HR Master Record- Infotype 0114 (Garnishment Amount D)
PA0115   HR Master Record- Infotype 0115 (Garnishment Wages D )
PA0116   HR Master Record- Infotype 0116 (Garn. Transfer D)
PA0117   HR Master Record- Infotype 0117 (Garn. Compensation D)
PA0118   HR Master Record- Infotype 0118 (Child Allowance D)
PA0119   HR Master Record- Infotype 0119 (Annual Income CA D)
PA0120   HR Master Record- Infotype 0120 (Pension Fund Trans. CH)
PA0121   HR Master Record- Infotype 0121 (RefPerNo Priority)
PA0122   HR Master Record- Infotype 0122 (Child Allowance Bonus D)
PA0125   HR Master Record- Infotype 0125 (Garnishment B)
PA0126   Infotype- Supplementary Pension Germany
PA0127   HR Master Record- Infotype 0127 (Commuter Traffic NL)
PA0128   HR Master Record- Infotype 0128 (Notifications)
PA0129   HR Master Record- Infotype 0129 (Text Number Assign.)
PA0130   HR Master Record- Infotpye 0130 (Checking Procedures)
PA0131   HR Master Record- Infotype 0131 (Garnishment/Cession A)
PA0132   HR Master Record- Infotype 0132 (Garnishment Claim A)
PA0133   HR Master Record- Infotype 0133 (Garn. Interest A)
PA0134   HR Master Record- Infotype 0134 (Garnishment Amount A)
PA0135   HR Master Record- Infotype 0135 (Spec. Garn. Cond. A)
PA0136   HR Master Record- Infotype 0136 (Garn. Transfer A)
PA0137   HR Master Record- Infotype 0137 (Garn. Compensation A)
PA0138   HR Master Record- Infotype 0138 (Family/Ref.Pers B)
PA0139   HR Master Record- Infotype 0139 (Employees Appl.No)
PA0140   HR Master Record- Infotype 0140 (SI Basic Data JP)
PA0141   HR Master Record- Infotype 0141 (SI Premium Data JP)
PA0142   HR Master Record- Infotype 0142 (Residence Tax JP)
PA0143   HR Master Record- Infotype 0143 (Life Insurance JP)
PA0144   HR Master Record- Infotype 0144 (Property Accum. JP)
PA0145   HR Master Record- Infotype 0145 (Personnel Tax Status JP)
PA0146   HR Master Record- Infotype 0146 (Y.E.A. Data JP)
PA0147   HR Master Record- Infotype 0147
PA0148   HR Master Record- Infotype 0148 (Family JP)
PA0149   HR Master Record Infotype 0149 (Tax Data South Africa)
PA0150   HR Master Record Infotype 0150 (Social Insurance SA)
PA0151   HR Master Record Infotype 0151 (Ext.Insurance South Africa)
PA0154   HR master record, infotype 0154 (social security data)
PA0155   HR master record, infotype 0155 (Suppl.admin.data)
PA0156   HR master data, infotype 0156 (Tax deduction)
PA0157   HR master record, infotype 0157 (User admin.data)
PA0158   HR mater record, infotype 0158 (Amounts paid by 3rd party)
PA0159   HR master record, infotype 0159 (Seniority)
PA0160   HR master record, infotype 0160 (Family allowance)
PA0161   HR Master Record- Infotype 0161 (Limits IRS)
PA0162   HR Master Record- Infotype 0162 (Ins. Y.E.T.A Data JP)
PA0165   HR Master Record- Infotype 0165 (Limits Deductions)
PA0167   HR Master Record- Infotype 0167 (Health Plans)
PA0168   HR Master Record- Infotype 0168 (Insurance Plans)
PA0169   HR Master Record- Infotype 0169 (Savings Plan)
PA0170   HR Master Record- Infotype 0170 (Flexible Spending Accounts)
PA0171   HR Master Record- Infotype 0171 (Gen. Benefits Information)
PA0172   HR Master Record- Infotype 0172 (FSA Claims)
PA0173   Tax card information
PA0177   HR Master Record- Infotype 0177 (Reg. Country of Birth NL)
PA0179   HR Master Record- Infotype 0179 (Tax SG)
PA0180   Alternative Address Data (Thailand)
PA0181   HR Master Record- Infotype 0181 [Add. Funds] (SG)
PA0182   HR Master Record- Infotype 0182 [Alternative Names] (SG)
PA0183   HR Master Record- Infotype 0183 [Awards] (SG)
PA0184   HR Master Record- Infotype 0184 [Resume text] (SG)
PA0185   HR Master Record- Infotype 0185 [Identification] (SG)
PA0186   HR Master Record- Infotype 0186 [Social Insurance] (SG)
PA0187   Additional family data
PA0188   Tax (Australia)
PA0189   HR Master Record- Infotype 0189 (Construction Pay- Funds)
PA0190   HR Master Data Record Infotype 0190 (BuildingTradePrevERDat)
PA0191   HR Master Record Infotype 0191 (BuildingTradeReimbursExpens)
PA0192   Personnel Master Record Infotype 0192 (BuildingTrade Attrib)
PA0194   HR Master Record Infotype 0194 (Garnishment Document)
PA0195   HR Master Record Infotype 0195 (Garnishment Order)
PA0196   HR Master Record-Infotype 0196 (Employee Provident Fund MY)
PA0197   HR Master Record-Infotype 0197 (SOCSO Contributions MY)
PA0198   Sheduled Tax Deductuion Malaysia
PA0199   Tax deduction CP38 / Additional amt / Bonus - Malaysia
PA0200   HR Master Record, Infotype 0200 (Garnishments DK)
PA0201   Personnel master record infotype 0201 (basic pension amnts)
PA0202   HR master data infotype 0202 (Entitlements)
PA0203   HR master record infotype 0203 (Pension/Reserve Status)
PA0204   HR Master Record, Infotype 0204 (DA/DS Statistics DK)
PA0205   HR Master Record- Infotype 0205
PA0206   HR Master Record- Infotype 0206, SI Finland
PA0207   HR Master Record- Infotype 0207 (Residence Tax Area)
PA0208   HR Master Record- Infotype 0208 (Work Tax Area - USA)
PA0209   HR Master Record- Infotype 0209 (Unemployment Insurance USA)
PA0210   HR Master Record- Infotype 0210 (W4 USA)
PA0211   HR Master Record- Infotype 0211 (COBRA Beneficiaries)
PA0212   HR Master Record- Infotpye 0212 (COBRA Health Plan)
PA0213   Additional family information - Malaysia
PA0214   HR Master Record Infotype 0214
PA0215   Building Trade Transaction Data
PA0216   Garnishment Adjustment
PA0217   HR Master Record Infotype 0217 (INSEE code)
PA0218   HR Master Record- Infotype 0218 (Pensioner Fund No. - F)
PA0219   HR Master Record- Infotype 0219 (External Organizations)
PA0220   Superannuation (Australia)
PA0221   HR Master Record- Infotype 0221 (Manual Checks)
PA0222   HR Master Record for Infotype 0222 (Company Cars GB)
PA0224   Tax information - infotype 0224 - Canada
PA0225   HR Master Record for Infotype 0225 (Company Cars GB 2)
PA0227   Tax file number (Australia)
PA0228   HR Master Record- Infotype 0228
PA0230   HR Master Record- Infotype 0230 / View 0008 (PSG)
PA0231   HR Master Record- Infotype 0231 / View 0001 (PSG)
PA0232   Personal-master record infotype 0232 (Child Allowance) (D)
PA0233   HR Master Record Infotype 0233 ('Bilan Social' FR)
PA0234   HR Master Record Infotype 0234 (Add. Withh. Inform. - USA)
PA0235   HR Master Record- Infotype 0235 (Other Taxes - USA)
PA0236   HR Master Record- Infotype 0236 (Credit Plans)
PA0237   HR Master Record- Infotype 0237 / View for 0052 (PSG)
PA0241   Indonesian Tax Data
PA0242   JAMSOSTEK Details, Indonesia
PA0261   Leave Accrual Australia
PA0263   HR Master Record for Infotype 0263
PA0264   HR Master Record- Infotype 0264/view for Infotype 0021
PA0265   HR Master Record- Infotype 0265 / Special Regulations (PSG)
PA0266   HR Master Record- Infotype 0266 / View 0027 (PSG)
PA0267   HR Master Record- Infotype 0267 (One time Payment off-cycle)
PA0268   HR Master Record Infortype view 0045 and 0268 (Loan JPN)
PA0269   HR Master Record- Infotype 0269 (ADP Information USA)
PA0270   HR Master Data Record- Infotype 0270 (COBRA Payments)
PA0271   HR master data infotype 0271 (Public Sector statistics)
PA0272   HR Master Record Infotype 0272 (Garnishment FR)
PA0273   HR Master Record- Infotype 0273 (Tax - SE)
PA0274   HR Master Record- Infotype 0274 (Insurance - SE)
PA0275   HR Master Record- Infotype 0275 (Garnishment - SE)
PA0276   HR Master Record- Infotype 0276 (OPIS - SE)
PA0277   HR Master Record- Infotype 0277 (Exceptions - SE)
PA0278   HR Master Record- Infotype 0278 (Basic Data PF [CH])
PA0279   HR Master Record- Infotype 0279 (Individual Values PF [CH])
PA0280   HR Master Record Infotype 0280/View for 0016
PA0281   HR Master Record Infotype 0281/View for 0045
PA0283   HR Master Record for Infotype 0283 (Archiving)
PA0288   HR CH- HR Master Record Infotype 0021 (Suppl. Switzerland)
PA0302   HR Master Record- Infotype 0302 (Additional Actions)
PA0303   HR Master Record- Infotype 303 (reductn tax/soc.ins.contrNL)
PA0304   Basic pay - additional information
PA0305   HR master record, infotype 0305 (previous employer)
PA0306   HR master record, infotype 0306 (Family data)
PA0309   IRD Number Infotype NZ
PA0310   Superannuation NZ
PA0311   Leave Adjustments - NZ
PA0312   Leave History Adjustments NZ
PA0313   Employee Taxation Detail Infotype NZ
PA0314   I0314- Days for Vacation Bonus and Sal. Deducs (DK/N)
PA0315   CATS- Sender Information
PA0317   HR Master Record- Infotype 0317 (special arrangements)
PA0318   HR Master Record- Infotype Family data for Indonesia (0318)
PA0319   Indonesia Private Insurances
PA0320   Official housing
PA0321   Employee accommodations
PA0322   HR Master Data Record Infotype 0322 (Pensions and Rel. Ben.)
PA0323   HR Master Record Infotype 0323 (Pension Plan)
PA0326   HR Master Record IT 0326 (Imputation to Pension Payments)
PA0329   HR master record infotype 0329 ( Sideline Job)
PA0330   Infotype 0330 (Non-monetary remuneration)
PA0331   HR Master Record- Infotype 0331 (Tax - PT)
PA0332   HR Master Record- Infotype 0332 (Social Security - PT)
PA0333   HR Master Record- Infotype 0333 (Disability - P)
PA0334   HR Master Record- Infotype 0334
PA0335   HR Master Data- Infotype 0335 (view of infotype 21 - PT)
PA0336   HR Master Data- Infotype 0336 (view of infotype 2 - PT)
PA0337   HR Master Record- Infotype 0337 (Prof. Classifications - PT)
PA0338   HR Master record- Infotype 0338 (Absence pay. clearing - PT)
PA0341   HR - master record infotype 341 (DUEVO start)
PA0342   HR Master Record- Infotype 0342 (HK Extension to I0002)
PA0344   HR Master Record- Infotype 0344 (Familiy members HK)
PA0345   HR Master Record- Infotype 0345 (Hong Kong Tax)
PA0346   HR Master Record- Infotype 0346 (Contribution plan)
PA0347   HR Master Record- Infotype 0347 (Entitlement plan)
PA0348   HR Master Record- Infotype 0348 (HK Appraisal and bonus)
PA0349   HR Master Record- Infotype 0349 (Eligibility grouping)
PA0351   HR Master Record- Infotype 0351 (Country Information)
PA0352   NHI for Family member (TW)
PA0353   Income Tax Taiwan
PA0354   Labor Insurance Taiwan
PA0355   National Health Insurance Taiwan
PA0356   Employment Stabilization Fund (TW)
PA0357   Saving Plan (TW)
PA0358   Employee Welfare Fund (TW)
PA0359   HR Master Record - Infotype 0359 (PRSI Ireland)
PA0360   HR Master Record - Infotype 0360 (PRSI Ireland)
PA0361   HR Master Record - Infotype 0361 (Pensions Admin. - IE)
PA0362   HR Master Record- Infotype Membership for Indonesia (0362)
PA0363   Previous employment period
PA0364   Infotype Tax TH
PA0365   Social Security TH
PA0366   Provident Fund THAILAND
PA0367   HR Master Record- Infotype 0367 (SI Notification Suppl. A)
PA0368   Rehabilitants
PA0369   Master data- Infotype 0369 (IMSS data)
PA0370   Master data- Infotype 0370 (INFONAVIT credit data)
PA0371   Master Data- Infotype 0371 (Tax on previous employment)
PA0372   Master data- Infotype 0372 (Integrated daily wage)
PA0373   HR loan repayment plan JP (for P0268)
PA0374   Infortype 0374- General Eligibility
PA0375   HR Master Data Record- Infotype 0375 (Add. Benefits Inform.)
PA0376   HR Master Data Record- Infotype 0376 (Medical Benefits Info)
PA0377   HR Master Record- Infotype 0377 (Miscellaneous Plans)
PA0378   HR Master Data Record- Infotype 0378 (Benefit Adj. Reason)
PA0379   HR Master Record- Infotype 0379 (Stock Purchase Plans)
PA0380   HR Master Data Record Infotype 0380 (Comp. Adjustment)
PA0381   HR Master Record Infotype 0381 (Comp. Plan Eligibility)
PA0382   HR Master Data Record Infotype 0382 (Stock)
PA0383   HR Master Data Record Infotype 0383 (Compensation Package)
PA0384   HR Master Data Record Infotype 0384
PA0386   HR Master Record- Infotype 0386 (VHI Scheme)
PA0387   HR Master Record - Infotype 0387 (Starter's Details)
PA0388   HR Master Record- Infotype 0388 (Union JP)
PA0389   Income Tax- General indicators
PA0390   Income Tax- Deductions
PA0391   Income Tax- Information on other employers
PA0392   Social Security- General data
PA0393   Family data- Calendar year schooling assistance
PA0394   Family data- Additional information
PA0395   HR Master Record- Infotype 0395 (External Org.Assignment)
PA0396   HR Master Record- Infotype 0396 (Expatriate Attributes)
PA0397   Infotype 0021 Family
PA0398   Infotype 0016 - Corporation and contract agreements
PA0399   HRMS-VE- Table for Income Tax Infotype (IT0399)
PA0400   HRMS-VE- Table for SSO Infotype (IT0400)
PA0401   HRMS-VE- Table for Benefits Infotype (IT401)
PA0402   HR Master Data Infotype 0402
PA0403   HR Master Record for Infotype 0403
PA0404   HR Master Record- Infotype 0404 (Military Service Taiwan)
PA0405   HR Master Record- Infotype 0405 (Absence Event)
PA0406   HR-PSG- Infotype 0406 (Pension information)
PA0407   HR master record, infotype 0407 (Abs.addit.inf.)
PA0408   HR Master Record- Infotype 0408 (CBS NL)
PA0409   HR Master Record- Infotype 0409 (External Agencies NL)
PA0410   Infotype 0410 - Transportation ticket
PA0411   Taxation Philippines - infotype
PA0412   HR Master Record- Infotype 0412 [View to I0021] (SG)
PA0415   HR Master Record- Infotype 0415
PA0416   Time Quota Compensation Infotype- Database Table
PA0419   HR Master record- Manual tax reporting information - Norway
PA0421   HR master record, infotype 0421 (spec.remuner.)
PA0422   SSS Philippines infotype
PA0423   HR Master Record- Infotype 0423
PA0424   Industrial Accident / Maternity / Sickness Statement (FR)
PA0425   Data Entry of Per Diem Sick Pay Summary
PA0426   Garnishment
PA0427   Debts by garnishment
PA0428   Beneficiary data (Additional information)
PA0433   HR Master Record Infotype 0433/View for 0009
PA0434   HR Master Record Infotype 0434/View for 0011 (GB Version)
PA0435   HR Master Record for Infotype 0435
PA0436   HR Master Record for Infotype 0436
PA0437   Multiple employment (BR)
PA0438   HR Master Record- Infotype 0438
PA0439   HR Master Record for Infotype 0439 (Data Transfer)
PA0440   HR Master Record- Infotype 0440 (Receipts)
PA0442   HR Master Record- Infotype 0442
PA0447   US Federal Tax MTD
PA0448   US Federal Tax QTD
PA0449   HR Master Record- Infotype 0449
PA0450   HR Master Record- Infotype 0450
PA0451   HR Master Record- Infotype 0451
PA0452   HR Master Record- Infotype 0452
PA0453   HR Master Record- Infotype 0453
PA0454   HR Master Record- Infotype 0454
PA0455   HR Master Record- Infotype 0455
PA0456   HR Master Record- Infotype 0456
PA0457   HR Master Record- Infotype 0457
PA0458   HR Master Record for Infotype 0458
PA0459   HR Master Record for Infotype 0459
PA0460   HR Master Record for Infotype 0460
PA0467   Personnel master data Infotype 0467 (SI addit.notif. pl.c.A)
PA0468   HR master record for infotype 0468
PA0469   HR master record for infotype 0469
PA0470   HR master record infotype 0470 (travel profiles)
PA0471   HR master record infotype 0471 (flight preferences)
PA0472   HR master record infotype 0472 (hotel preferences)
PA0473   HR master record infotype 0473 (rental car preferences)
PA0474   HR master record infotype 0474 (train preferences)
PA0475   HR master record infotype 0475 (customer programs)
PA0476   Personnel Master Record for Infotype 0476 (Garnishments)
PA0477   Personnel Master Record Infotype 0477- Debt (Garnishments)
PA0478   Personnel Master Record Infotype 0478- Adjustment (Garnish)
PA0480   HR master record for infotype 0480
PA0482   HRMS-VE- Additional Data from Family/N. of Kin Inftp(IT0021)
PA0483   Infotype 0483 - Data entry by CAAF - Italy only
PA0486   HR-SG-PS- Master Data (National Service)
PA0487   HR-SG-PS- Security / medical Clearance
PA0488   HR-SG-PS- Leave scheme
PA0489   HR-SG-PS- Voluntary Service / ECA
PA0490   HR-PS-SG- Employee Suggestion Scheme
PA0491   HR Master Record- Infotype 491
PA0493   HR-SG-PS- Extension of infotype 0022
PA0494   HR-PS-SG- Employee Suggestion Scheme - Evaluation Results
PA0495   HR-PS-SG- Pensions Scheme
PA0502   Letter of appointment
PA0503   Pensioner's Definition
PA0504   Pensioner's Advantage B
PA0505   HR Master Record- Infotype 0505
PA0506   Tip Indicators
PA0510   HR Master Record- Infotype 0510 (Tax-sheltered annuity)
PA0511   Infotype Cost-of-Living Allowance/Office (0511)
PA0512   Personnel Master Record Infotype 0512
PA0521   HR Master Record- Infotype 0521 (Semiretirement D)
PA0525   Child Care
PA0526   HR Master Data Record Infotype 0526
PA0527   HR Master Data Record Infotype 0527
PA0546   HR-SG- Master Record- Infotype 0546 [Termination Data)
PA0547   BIK Infotype for Malaysia
PA0548   Infotype 0548 - Suppl.social security funds - Italy only
PA0551   Termination of contract- General data
PA0552   HR Master Data Record for Infotype 0552
PA0553   HR Master Data Record for Infotype 0553
PA0554   HR Master Record- Infotype 0554
PA0559   HR Master Record- Infotype 0559 (Commuting allowance Info.)
PA0560   HR Master Record- Infotype 0560
PA0561   Data for tax
PA0565   HR Master Record- Infotype 0565 (Retirement Plan Val. Res.)
PA0566   HR Master Record- Infotype 0566
PA0569   HR Master Record- Infotype 0569
PA0570   HR Master Record- Infotype 0570
PA0571   HR Master Record- Infotype 0571
PA0572   HR Master Record- Infotype 0572
PA0578   HR Master Record- Infotype 0578
PA0579   HR Master Record Infotype 0579 (Ext. Salary Elements)
PA0592   HR Master Data Record Infotype 0592 (Foreign Public Sector)
PA0593   Rehabilitants
PA0595   HR Master Data Record for Infotype 0595
PA0596   PhilHealth Philippines Infotype
PA0602   HR Master Record- Infotype 0602 (Retirement Plan Cumulation)
PA0611   HR Master Record- Infotype 0611
PA0612   HR Master Record- Infotype 0612
PA0625   Infotype 0002 - Race/complexion
PA0628   HR Master Record for Infotype 0628
PA0629   HR Master Record for Infotype 0629
PA0630   HR Master Record for Infotype 0630
PA0631   HR Master Record for Infotype 0631
PA0634   Philippines Previous Employer Information Info-type
PA0645   Contract termination- General data
PA0900   HR Master Record- Infotype 0900 (Sales Data)
PA0901   HR Master Record- Infotype 0901 (Purchasing Data)

27
Varios / Tablas Modulo FI
« en: 03 de Noviembre de 2007, 10:57:59 am »
AGKO   Cleared Accounts
ANAR   Asset Types
ANAT   Asset type text
ANEK   Document Header Asset Posting
ANEP   Asset Line Items
ANEV   Asset downpymt settlement
ANKT   Asset classes- Description
ANLA   Asset Master Record Segment
ANLB   Depreciation terms
ANLC   Asset Value Fields
ANLH   Main asset number
AT02T   Transaction Activity Category- Description
AT02A   Transaction Code for Menu TIMN
AT10   Transaction type
AT10T   Name of Transaction Type
BKDF   Document Header Supplement for Recurring Entry
BKORM   Accounting Correspondence Requests
BKPF   Accounting Document Header
BLPK   Document log header
BLPP   Document log item
BLPR   Document Log Index and Planned Order (Backflush)
BNKA   Bank master record
BP000   Business Partner Master (General Data)
BPBK   Doc.Header Controlling Obj.
BPEG   Line Item Total Values Controlling Obj.
BPEJ   Line Item Annual Values Controlling Obj.
BPEP   Line Item Period Values Controlling Obj.
BPGE   Totals Record for Total Value Controlling obj.
BPJA   Totals Record for Annual Total Controlling Obj.
BSAD   Accounting- Secondary Index for Customers (Cleared Items)
BSAK   Accounting- Secondary Index for Vendors (Cleared Items)
BSAS   Accounting- Secondary Index for G/L Accounts (Cleared Items)
BSEC   One-Time Account Data Document Segment
BSEG   Accounting Document Segment
BSID   Accounting- Secondary Index for Customers
BSIK   Accounting- Secondary Index for Vendors
BSIM   Secondary Index, Documents for Material
BSIS   Accounting- Secondary Index for G/L Accounts
CEPC   Profit Center Master Data Table
CEPCT   Texts for Profit Center Master Data
COBRA   Settlement Rule for Order Settlement
COBRB   Distribution Rules Settlement Rule Order Settlement
COKA   CO Object- Control Data for Cost Elements
COSP   CO Object- Cost Totals for External Postings
COSS   CO Object- Cost Totals for Internal Postings
CRCO   Assignment of Work Center to Cost Center
CSKA   Cost Elements (Data Dependent on Chart of Accounts)
CSKB   Cost Elements (Data Dependent on Controlling Area)
CSLA   Activity master
FEBEP   Electronic Bank Statement Line Items
FPLA   Billing Plan
FPLT   Billing Plan- Dates
GLPCT   EC-PCA- Totals Table
KNA1   General Data in Customer Master
KOMK   Pricing Communication Header
MAHNV   Management Records for the Dunning Program
REGUT   TemSe - Administration Data
SKA1   G/L Account Master (Chart of Accounts)
SKAT   G/L Account Master Record (Chart of Accounts- Description)
SKB1   G/L account master (company code)
T003T   Document Type Texts
T007S   Tax Code Names
T087J   Text
TAPRFT   Text tab. for investment profile
TKA01   Controlling Areas
TKA09   Basic Settings for Versions
TKVS   CO Versions
TZB0T   Flow types text table
TZPAT   Financial Assets Management product type texts
VBSEGS   Document Segment for G/L Accounts Document Parking
VTBFHA   Transaction
VTBFHAPO   Transaction Flow
VTBFHAZU   Transaction Activity
VTBFINKO   Transaction Condition
VTIDERI   Master Data Listed Options and Futures
VTIFHA   Underlying transaction
VTIFHAPO   Underlying transaction flows
VTIFHAZU   Underlying transaction status table
VTIOF   Options Additional Data
VWPANLA   Asset master for securities

28
Varios / Tablas Plantas/Ventas/Distribucion
« en: 03 de Noviembre de 2007, 10:57:14 am »
AFAB   Network - Relationships
AFFH   PRT assignment data for the work order
AFFL   Work order sequence
AFFT   Order - Process Instructions
AFFV   Order - Process Instruction Values
AFFW   Goods movements with errors from confirmations
AFIH   Maintenance order header
AFKO   Order header data PP orders
AFPO   Order item
AFRC   Incorrect cost calculations from confirmations
AFRD   Default values for collective confirmation
AFRH   Header information for confirmation pool
AFRU   Order completion confirmations
AFRV   Confirmations pool
AFVC   Operation within an order
AFVU   DB structure of the user fields of the operation
AFVV   DB structure of the quantities/dates/values in the operation
AFWI   Subsequently posted goods movements for confirmations
AUFK   Order master data
AUFM   Goods movements for order
BGMK   Master Warranty Header
BGMP   Master Warranty Item
BGMS   Master Warranty Text Item
BGMT   Master Warranty Text
BGMZ   Warranty Counter
CRHD   Work Center Header
CRTX   Text for the Work Center or Production Resource/Tool
EQKT   Equipment Short Texts
EQST   Equipment to BOM Link
EQUI   Equipment master data
EQUZ   Equipment time segment
HIKO   Order master data history
IFLO   Table generated for View IFLO
IFLOT   Functional Location (Table)
IFLOTX   Functional Location- Short Texts
IHGNS   Permit Segment for Plant Maintenance
IHPA   Plant Maintenance- Partners
IHSG   Object-Related Permits in Plant Maintenance
ILOA   PM Object Location and Account Assignment
IMPTT   Measuring Point (Table)
IMRG   Measurement Document
KAKO   Capacity Header Segment
KONP   Conditions (Item)
KONV   Conditions (Transaction Data)
OBJK   Plant Maintenance Object List
QMEL   Quality Notification
QMFE   Quality notification - items
QMIH   Quality message - maintenance data excerpt
QMMA   Quality notification - activities
QMSM   Quality notification - tasks
QMUR   Quality notification - causes
T001   Company Codes
T001L   Storage Locations
T001W   Plants/Branches
T077D   Customer account groups
T003O   Order Types
T352R   Maintenance revisions
T353I_T   Maintenance activity type description
T356   Priorities
T357G   Permits
T357G_T   Text for Table 357GT
T370A   Activity Category for PM Lists
TINCT   Customers- Incoterms- Texts
TVKO   Organizational Unit- Sales Organizations
TVKOS   Organizational Unit- Divisions per Sales Organization
TVKOV   Org. Unit- Distribution Channels per Sales Organization
TVTA   Organizational Unit- Sales Area(s)
VIAUFKST   Generated Table for View VIAUFKST

29
Varios / Tablas de Compras
« en: 03 de Noviembre de 2007, 10:56:04 am »
A501   Plant/Material
EBAN   Purchase Requisition
EBKN   Purchase Requisition Account Assignment
EKAB   Release Documentation
EKBE   History per Purchasing Document
EKET   Scheduling Agreement Schedule Lines
EKKN   Account Assignment in Purchasing Document
EKKO   Purchasing Document Header
EKPO   Purchasing Document Item
IKPF   Header- Physical Inventory Document
ISEG   Physical Inventory Document Items
LFA1   Vendor Master (General section)
LFB1   Vendor Master (Company Code)
NRIV   Number range intervals
RESB   Reservation/dependent requirements
T161T   Texts for Purchasing Document Types

30
Varios / Tablas Manejo de Materiales
« en: 03 de Noviembre de 2007, 10:55:26 am »
EINA   Purchasing Info Record- General Data
EINE   Purchasing Info Record- Purchasing Organization Data
MAKT   Material Descriptions
MARA   General Material Data
MARC   Plant Data for Material
MARD   Storage Location Data for Material
MAST   Material to BOM Link
MBEW   Material Valuation
MKPF   Header- Material Document
MSEG   Document Segment- Material
MVER   Material Consumption
MVKE   Sales Data for materials
RKPF   Document Header- Reservation
T023   Mat. groups
T024   Purchasing Groups
T156   Movement Type
T157H   Help Texts for Movement Types

Páginas: 1 [2] 3