First Project - BCS

***INCLUDE LUCR_LSTF03 .
*&       Form  display_detail_list
FORM display_detail_list_subscreen.
  IF g_display_detail_again IS INITIAL.
    IF g_display_detail_next IS INITIAL.
* Header text is displayed as dyn. document
      IF go_dydo IS INITIAL.
        CREATE OBJECT go_dydo.
      ELSE.
        FREE  go_dydo.
        CLEAR go_dydo.
        CREATE OBJECT go_dydo.
        PERFORM free_create_screen_objects.
      ENDIF.
    ELSE.
      IF NOT go_dydo->html_control IS INITIAL.
        CALL METHOD go_splitter_container->remove_control
          EXPORTING
            row    = 1
            column = 1.
      ENDIF.
    ENDIF.
  ENDIF.
* Initialize document
  CALL METHOD go_dydo->initialize_document.
  IF  LINES( gt_header ) > 0.
* Build and display detail-header
    PERFORM build_header TABLES gt_header
                         USING  go_dydo
                                gs_header.
  ENDIF.
* Merge header-document
  CALL METHOD go_dydo->merge_document.
* set toolbar-added functions for detailed list
  REFRESH gt_toolbar.
  IF go_model->ds_tx_data_io_type-documents IS BOUND.       "mb210303
    PERFORM fill_tool_tab USING:
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '1',
                 gt_toolbar gs_toolbar 'UCR_ENTRIES' '2',
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '3',
                 gt_toolbar gs_toolbar 'UCR_PREV'    '4',
                 gt_toolbar gs_toolbar 'UCR_NEXT'    '5',
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '6'.
  ELSE.                                                   "mb210202 beg.
    PERFORM fill_tool_tab USING:
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '1',
                 gt_toolbar gs_toolbar 'UCR_PREV'    '2',
                 gt_toolbar gs_toolbar 'UCR_NEXT'    '3',
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '4'.
  ENDIF.                                                  "mb210202 end.
  SET HANDLER go_event_grid->handle_toolbar_comp   FOR go_grid.
* Display header
  CALL METHOD go_dydo->display_document
    EXPORTING
      parent = go_container_head.
* Set header-control visible with user set or
* predefined height
  IF NOT go_splitter_container IS INITIAL.
    IF g_height IS INITIAL.
      g_height = 27.
    ENDIF.
    CALL METHOD go_splitter_container->set_row_height
      EXPORTING
        id     = 1
        height = g_height.
  ENDIF.
* display detail-list
  CALL METHOD go_grid->set_table_for_first_display
    EXPORTING
      i_bypassing_buffer   = 'X'
      is_layout            = gs_layout_save
      it_toolbar_excluding = gt_exclude_toolbar
    CHANGING
      it_fieldcatalog      = gt_fieldcat_d
      it_outtab            = <gt_outtab_detail>.
  IF NOT g_display_detail_next IS INITIAL.
    CALL METHOD go_grid->refresh_table_display.
  ENDIF.
* Set cursor on selected row if necesary
  IF NOT gt_row_id_detail IS INITIAL.
    CALL METHOD go_grid->set_selected_rows
      EXPORTING
        it_index_rows = gt_row_id_detail.
    REFRESH gt_row_id_detail.
  ENDIF.
  CLEAR: g_display_detail_next,
         g_display_detail_again.
ENDFORM.                    " display_detail_list_subscreen
*&      Form  display_main_list
FORM display_main_list_subscreen. "using i_reporting_logic type uc_flg.
  CLEAR g_detail.
* set toolbar-added functions
  REFRESH gt_toolbar.
  IF go_model->ds_tx_data_io_type IS NOT INITIAL.
    IF go_model->ds_tx_data_io_type-documents IS BOUND.     "mb210303
*        and i_reporting_logic is initial.
      PERFORM fill_tool_tab USING:
                   gt_toolbar gs_toolbar 'UCR_DUMMY'   '1',
                   gt_toolbar gs_toolbar 'UCR_ENTRIES' '2',
                   gt_toolbar gs_toolbar 'UCR_DUMMY'   '3',
                   gt_toolbar gs_toolbar 'UCR_SEL_COND' '4',
                   gt_toolbar gs_toolbar 'UCR_DUMMY'   '5'.
    ELSE.
      PERFORM fill_tool_tab USING:
                   gt_toolbar gs_toolbar 'UCR_DUMMY'   '1',
                   gt_toolbar gs_toolbar 'UCR_SEL_COND' '2',
                   gt_toolbar gs_toolbar 'UCR_DUMMY'   '3'.
    ENDIF.                                                  "mb210303
    SET HANDLER go_event_grid->handle_toolbar_comp   FOR go_grid.
  ELSE    .
    PERFORM fill_tool_tab USING:
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '1',
                 gt_toolbar gs_toolbar 'UCR_SEL_COND' '2',
                 gt_toolbar gs_toolbar 'UCR_DUMMY'   '3'.
    SET HANDLER go_event_grid->handle_toolbar_comp   FOR go_grid.
  ENDIF.
* Set header-control invisible while main-list is displayed
  IF NOT go_splitter_container IS INITIAL.
* Header container can be set visible by user on main-screen
    CALL METHOD go_splitter_container->set_row_height
      EXPORTING
        id     = 1
        height = 0.
    IF NOT go_dydo IS INITIAL.
* Display last header if user wants to set it visible
      CALL METHOD go_dydo->display_document
        EXPORTING
          parent = go_container_head.
    ENDIF.
  ENDIF.
* subscreen with main list simply is started once again
* prepared with current user settings
  IF ( LINES( gt_fieldcat_save ) > 0 ) AND
     NOT g_display_main_again IS INITIAL.
    REFRESH gt_fieldcat.
    gt_fieldcat[] = gt_fieldcat_save[].
*    clear g_display_main_again.
* is necessary, because current_frontend_fieldcat must be set
    CALL METHOD go_grid->set_table_for_first_display
      EXPORTING
        i_bypassing_buffer   = 'X'
        i_save               = g_save
        is_layout            = gs_layout
        is_variant           = gs_variant
        it_special_groups    = gt_sgrp                      "mb110403
        it_toolbar_excluding = gt_exclude_toolbar
      CHANGING
        it_fieldcatalog      = gt_fieldcat
        it_outtab            = <gt_outtab>.
* set current fieldcat
    CALL METHOD go_grid->set_frontend_fieldcatalog
      EXPORTING
        it_fieldcatalog = gt_fieldcat.
* now reset other current layout-infos if necessary
    PERFORM set_current_layout USING go_grid
                                     gt_filter_save
                                     gt_sort_save
                                     gs_layout_save.
* display current main-list
    CALL METHOD go_grid->refresh_table_display.
    REFRESH: gt_fieldcat_save, gt_filter_save, gt_sort_save.
    CLEAR  : gs_layout_save.
  ELSE.
* Show ALV
    CALL METHOD go_grid->set_table_for_first_display
      EXPORTING
        i_bypassing_buffer   = 'X'
        i_save               = g_save
        is_layout            = gs_layout
        is_variant           = gs_variant
        it_special_groups    = gt_sgrp                      "mb110403
        it_toolbar_excluding = gt_exclude_toolbar
      CHANGING
        it_sort              = gt_sort
        it_fieldcatalog      = gt_fieldcat
        it_outtab            = <gt_outtab>.
    CLEAR g_display_detail_again.
    g_display_main_again = 'X'.
  ENDIF.
* Set cursor on selected row if necesary
  IF NOT gt_row_id IS INITIAL.
    CALL METHOD go_grid->set_selected_rows
      EXPORTING
        it_index_rows = gt_row_id.
  ENDIF.
ENDFORM.                    " display_main_list_subscreen
*&      Form  display_message
FORM display_message USING lo_grid_object TYPE REF TO cl_gui_alv_grid
                           lf_refresh_msg_table TYPE c.
  DATA: l_lines       TYPE i,
        ls_layout     TYPE lvc_s_layo.
* header_main is not used by Worbench
  IF g_subscreen IS INITIAL.
    PERFORM header_main.
  ENDIF.
  g_no_data = 'X'.
* if first data selection results no data gt_parameter_save must be
* filled  from lt_parameter to take care of further user changed
* parameters from list screen
  DESCRIBE TABLE gt_parameter_save LINES l_lines.
  IF l_lines =  0.
    gt_parameter_save[] = gt_parameter[].
  ENDIF.
  PERFORM no_data_selected IN PROGRAM (gc_progname)
                            USING      gt_fieldcat_mess
                                       gs_fieldcat_mess
                                       gt_message
                                       gs_message
                                       text-101
                                       text-102
                                       'TEXT'
                                       'LT_MESSAGE'
                                       lf_refresh_msg_table   " 'X'
                                       space.      "  'C610'. no color, accessibility
*** Start of Comment By Ramesh Babu N,IBM - C1DK900725 ***
* Set header-control invisible while main-list is displayed
*  IF NOT go_splitter_container IS INITIAL.
*    CALL METHOD go_splitter_container->set_row_height
*      EXPORTING
*        id     = 1
*        height = 0.
*    CALL METHOD go_splitter_container->set_row_sash
*      EXPORTING
*        id    = 1
*        type  = cl_gui_splitter_container=>type_sashvisible
*        value = cl_gui_splitter_container=>false.
*  ENDIF.
*** End of Comment By Ramesh Babu N,IBM - C1DK900725  ***
* display messages
*  ls_layout-no_toolbar = 'X'.
  CALL METHOD lo_grid_object->set_table_for_first_display
    EXPORTING
      i_bypassing_buffer   = 'X'
      it_toolbar_excluding = gt_exclude_toolbar_mess
      is_layout            = ls_layout
    CHANGING
      it_fieldcatalog      = gt_fieldcat_mess
      it_outtab            = gt_message.
*** Start of Comment By Ramesh Babu N,IBM - C1DK900725 ***
* Event-Handler for docking-container
*  IF go_event_dock IS INITIAL.
*    CREATE OBJECT go_event_dock.
*  ENDIF.
*** End of Comment By Ramesh Babu N,IBM - C1DK900725  ***
  IF go_parameter IS INITIAL.
    CALL METHOD cl_uc_parameter=>get_instance
      IMPORTING
        eo_instance = go_parameter.
  ENDIF.
*** Start of Comment By Ramesh Babu N,IBM - C1DK900725 ***
*  SET HANDLER go_event_dock->handle_new_parameters FOR go_parameter.
*** End of Comment By Ramesh Babu N,IBM - C1DK900725  ***
ENDFORM.                    " display_message
*&      Form  sub_download_data
* Used for downloading BCS data to a TAB delimited file in Custom task *
*      <--ct_data  HASHED TABLE
FORM f_download_data  USING     ct_task     TYPE uc_task
                                ct_sel      TYPE uc0_ts_sel
                                gt_param    TYPE ucm_ts_parameter
                      CHANGING  ct_message  TYPE uc0_t_message
                                ct_data     TYPE HASHED TABLE..
* SUBROUTINE DESCRIPION: Used for downloading BCS data to file in Custome Task
*           DEVELOPER: Ramesh Babu Nalla , IBM
*       CREATION DATE: 2007-10-11
*          DER NUMBER: None
* TRANSPORT NUMBER(S): C1DK900725
* REVISION HISTORY-----------------------------------------------------*
*       REVISION NO: C1DK900725      REFERENCE NO:  None
*         DEVELOPER: Ramesh Babu N,IBM       DATE:  2007-10-11
*       DESCRIPTION: Copied from SAP FM UCR_LST_LOGIC *
  CONSTANTS : c_task01 TYPE uc_task VALUE 'T2700',
              c_task02 TYPE uc_task VALUE 'T2490'.
  TYPES:  BEGIN OF ty_download,
**            /bic/zcs_comp   TYPE char08,      " Unilever-Company
**            /bic/zcs_item   TYPE char10,      " Unilever-Item
**            /1fb/move_type  TYPE char03,      " Unilever-Movement type
**            /bic/zcs_pcom   TYPE char08,      " Unilever-Partner Company
**            /bic/zcs_invc   TYPE char08,      " Unilever-Investee Company
**            /bic/zcs_cang   TYPE char03,      " Unilever-Cost Analysis Group
**            /bic/zcs_ad     TYPE char08,      " Unilever-Aquisitions/Disposals
**            /bic/zcs_cd     TYPE char08,      " Unilever-Continued/Discontinued Ops.
**            /bic/zcs_prgp   TYPE char08,      " Unilever-Product Category
            /bic/zfb_comp   TYPE char08,      " Unilever-Company
            /bic/zfb_item   TYPE char10,      " Unilever-Item
            /bic/zfb_move   TYPE char03,      " Unilever-Movement type
            /bic/zfb_pcom   TYPE char08,      " Unilever-Partner Company
            /bic/zfb_invc   TYPE char08,      " Unilever-Investee Company
            /bic/zfb_cang   TYPE char03,      " Unilever-Cost Analysis Group
            /bic/zfb_ad     TYPE char08,      " Unilever-Aquisitions/Disposals
            /bic/zfb_cd     TYPE char08,      " Unilever-Continued/Discontinued Ops.
            /bic/zfb_prgp   TYPE char08,      " Unilever-Product Category
            /1fb/cs_trn_lc  TYPE string,      " Unilever-Period value in Local currency
            /1fb/cs_trn_qty TYPE string,     " Unilever-Periodic quantity
            unit            type string,
          END OF ty_download.
* flag
  DATA flg_chk TYPE c.
  DATA: lr_s_data_out TYPE REF TO data,
        lr_t_data_out TYPE REF TO data,
        l_outtype     TYPE field_type VALUE 'UCR_SX_TX_DATA_LST',
        lr            TYPE REF TO data,
        lo_conv       TYPE REF TO lcl_convert_output,
        lt_char       TYPE lcl_convert_output=>th_comp,
        ls_comp       TYPE lcl_convert_output=>s_comp,
        lr_s_data     TYPE REF TO data,
        lr_t_data     TYPE REF TO data,
        l_filename    TYPE string,
        l_action      TYPE i,
        l_path        TYPE string,
        l_seperator   TYPE char01 VALUE 'X',
        l_fullpath    TYPE string,
        l_mmyy        TYPE string,
        lr_sel_data   TYPE REF TO data,
        lr_t_val      TYPE REF TO data,
        lr_t_final    TYPE REF TO data,
        lr_val        TYPE REF TO data,
        ls_download   TYPE REF TO data,
        lt_download   TYPE REF TO data,
        ls_sel        TYPE REF TO data,
        ls_msg        TYPE uc0_s_message.
** SOC by Dpak-------------------------------------------------------------------------------------------
** Changed by Deepak N Jain, IBM on 16/11/2006 as the corresponding field name assigned by Ramesh from
** the structure <LS_DATA_OUT> are not matching. This is because of the new cube from whch the Financial
** data is coming now. The new cube is ZFBCS_T1 which has replaced the old cube ZCS_T1.
** Hence, Short Dump on Execution.
**  DATA: l_comp        TYPE string VALUE '/BIC/ZCS_COMP',  " Unilever-Company
**        l_cgcomp      TYPE string VALUE '/1FB/SEM_CGCOMP'," Unilever-Consolidation Group
**        l_pcomp       TYPE string VALUE '/BIC/ZCS_PCOM',  " Unilever-Partner Company
**        l_doct        TYPE string VALUE '/BIC/ZCS_DOCT',  " Unilever-Document type
**        l_plevel      TYPE string VALUE 'CS_PLEVEL',      " Unilever-Posting Level
**        l_tc          TYPE string VALUE '/1FB/CS_TRN_TC', " Unilever-Period value in Transaction currency
**        l_qty         TYPE string VALUE '/1FB/CS_TRN_QTY'," Unilever-Periodic quantity
**        l_trn_lc      TYPE string VALUE '/1FB/CS_TRN_LC', " Unilever-Period value in Local currency
**        l_bu          TYPE string VALUE '/BIC/ZCS_PROF',  " Unilever-Business Unit/Cost Centre
**        l_low         TYPE string VALUE 'LOW'.
  DATA: l_comp        TYPE string VALUE '/BIC/ZFB_COMP',  " Unilever-Company
        l_cgcomp      TYPE string VALUE '/BIC/ZFB_CG1',   " Unilever-Consolidation Group
        l_pcomp       TYPE string VALUE '/BIC/ZFB_PCOM',  " Unilever-Partner Company
        l_doct        TYPE string VALUE '/BIC/ZFB_DOCT',  " Unilever-Document type
        l_invc        TYPE string VALUE '/BIC/ZFB_INVC',  " Unilever-Investee Company
        l_plevel      TYPE string VALUE 'CS_PLEVEL',      " Unilever-Posting Level
        l_tc          TYPE string VALUE '/1FB/CS_TRN_TC', " Unilever-Period value in Transaction currency
        l_qty         TYPE string VALUE '/1FB/CS_TRN_QTY'," Unilever-Periodic quantity
        l_trn_lc      TYPE string VALUE '/1FB/CS_TRN_LC', " Unilever-Period value in Local currency
        l_bu          TYPE string VALUE '/BIC/ZCS_PROF',  " Unilever-Business Unit/Cost Centre
        l_low         TYPE string VALUE 'LOW',
        l_unit        TYPE string  VALUE 'UNIT'.
** EOC by Dpak-----------------------------------------------------------------------------------------------
** future use **
**  FISCVARNT TYPE L0002FISCVARNT,
**  FISCPERIOD TYPE L0002FISCPERIOD,
**  /BIC/ZFB_VERS TYPE L0002/BIC/ZFB_VERS,
**  /BIC/ZFB_CG1 TYPE L0002/BIC/ZFB_CG1,
**  /BIC/ZFB_COMP TYPE L0002/BIC/ZFB_COMP,
**  /1FB/CS_CHART TYPE L0002/1FB/CS_CHART,
**  /BIC/ZFB_MOVE TYPE L0002/BIC/ZFB_MOVE,
**  /BIC/ZFB_PCOM TYPE L0002/BIC/ZFB_PCOM,
**  ACQ_YEAR TYPE L0002ACQ_YEAR,
**  ACQ_PER TYPE L0002ACQ_PER,
**  /BIC/ZFB_INVC TYPE L0002/BIC/ZFB_INVC,
**  /BIC/ZFB_ALCO TYPE L0002/BIC/ZFB_ALCO,
**  CS_PLEVEL TYPE L0002CS_PLEVEL,
**  /BIC/ZFB_DOCT TYPE L0002/BIC/ZFB_DOCT,
**  BCS_CTFLG TYPE L0002BCS_CTFLG,
**  UNIT TYPE L0002UNIT,
**  /1FB/CURKEY_TC TYPE L0002/1FB/CURKEY_TC,
**  /1FB/CURKEY_LC TYPE L0002/1FB/CURKEY_LC,
**  /1FB/CURKEY_GC TYPE L0002/1FB/CURKEY_GC,
**  /BIC/ZFB_PRGP TYPE L0002/BIC/ZFB_PRGP,
**  /BIC/ZFB_COUN TYPE L0002/BIC/ZFB_COUN,
**  /BIC/ZFB_CANG TYPE L0002/BIC/ZFB_CANG,
**  /1FB/FUNC_AREA TYPE L0002/1FB/FUNC_AREA,
**  /BIC/ZFB_CT TYPE L0002/BIC/ZFB_CT,
**  /BIC/ZFB_CD TYPE L0002/BIC/ZFB_CD,
**  /BIC/ZFB_AD TYPE L0002/BIC/ZFB_AD,
**  /BIC/ZFB_FR01 TYPE L0002/BIC/ZFB_FR01,
**  /BIC/ZFB_FR02 TYPE L0002/BIC/ZFB_FR02,
**  FISCYEAR TYPE L0002FISCYEAR,
**  /BIC/ZFB_ITEM TYPE L0002/BIC/ZFB_ITEM,
** future use **
  FIELD-SYMBOLS: <lt_data_out> TYPE STANDARD TABLE,
                 <ls_data_out> TYPE ANY,
                 <ls_data>     TYPE ANY,
                 <ls_data_cop> TYPE ANY,
                 <lt_data_std> TYPE STANDARD TABLE,
                 <ls_data_std> TYPE ANY,
                 <ls_download>  TYPE ANY,
                 <lt_download> TYPE STANDARD TABLE,
                 <comp>        TYPE ANY,
                 <cgcomp>      TYPE ANY,
                 <pcomp>       TYPE ANY,
                 <doct>        TYPE ANY,
                 <plevel>      TYPE ANY,
                 <tc>          TYPE ANY,
                 <invc>        TYPE ANY,
                 <qty>         TYPE ANY,
                 <unit>        TYPE ANY,
                 <trn_lc>      TYPE ANY,
                 <comp1>       TYPE ANY,
                 <cgcomp1>     TYPE ANY,
                 <pcomp1>      TYPE ANY,
                 <doct1>       TYPE ANY,
                 <plevel1>     TYPE ANY,
                 <tc1>         TYPE ANY,
                 <invc1>       TYPE ANY,
                 <qty1>        TYPE ANY,
                 <trn_lc1>     TYPE ANY,
                 <unit1>       TYPE ANY,
                 <bu>          TYPE ANY,
                 <bu1>         TYPE ANY,
                 <low>         TYPE ANY,
                 <l_year>      TYPE ANY ,
                 <l_period>    TYPE ANY ,
                 <l_mmyy>      TYPE ANY,
                 <ls_sel_data> TYPE ANY,
                 <ls_val>      TYPE zbcs_check_val,
                 <lt_t_val>    TYPE STANDARD TABLE,
                 <lt_t_final>  TYPE STANDARD TABLE.
**************** Begin Of Addtion - ASIF MAQBOOL ******************
  Data: BEGIN OF l_s_tab,
        values TYPE C LENGTH 400,
       end OF l_s_tab,
      gs_param LIKE LINE OF gt_param,
      l_temp_store LIKE gt_param.
  Field-SYMBOLS: <gt_param> TYPE ANY TABLE,
                 <final_gt> TYPE any ,
                 <gs_fieldname> TYPE any,
                 <gs_value> TYPE any.
  Data: l_t_tab TYPE TABLE OF string INITIAL SIZE 0,
       str TYPE string,
       str1 TYPE string.
**************** End Of Addtion - ASIF MAQBOOL ******************
* create Line-structure of data table
  CREATE DATA lr_s_data LIKE LINE OF ct_data.
  ASSIGN lr_s_data->* TO <ls_data_std>.
** create cumulation table
  CREATE DATA lr_t_data LIKE STANDARD TABLE OF <ls_data_std>.
  ASSIGN lr_t_data->* TO <lt_data_std>.
  LOOP AT ct_data INTO <ls_data_std>.
    COLLECT <ls_data_std> INTO <lt_data_std>.
  ENDLOOP.
  FREE ct_data.
* get reference for outtab / create outtab
  CALL METHOD go_model->create_data_reference
    EXPORTING
      io_tx_data_io_type = go_model->ds_tx_data_io_type-totals
      i_type             = l_outtype "'UCR_SX_TX_DATA_LST'
    IMPORTING
      er_data            = lr_s_data_out.
  ASSIGN lr_s_data_out->* TO <ls_data_out>.
  ASSIGN lr_s_data_out->* TO <ls_data_cop>.
  CREATE DATA lr_t_data_out LIKE STANDARD TABLE OF <ls_data_out>.
  ASSIGN lr_t_data_out->* TO <lt_data_out>.
  CREATE DATA lr LIKE LINE OF <lt_data_std>.
  ASSIGN lr->* TO <ls_data>.
  CALL METHOD lcl_convert_output=>get_instance
    EXPORTING
      io_model    = go_model
      it_char     = lt_char
    IMPORTING
      eo_instance = lo_conv
    CHANGING
      cs_data     = <ls_data>.
  ASSIGN: l_comp   TO <comp>,
          l_cgcomp TO <cgcomp>,
          l_pcomp  TO <pcomp>,
          l_invc   TO <invc>,
          l_doct   TO <doct>,
          l_plevel TO <plevel>,
          l_tc     TO <tc>,
          l_qty    TO <qty>,
          l_trn_lc TO <trn_lc>,
          l_bu     TO <bu>,
          l_mmyy   TO <l_mmyy>,
          l_low    TO <low>,
          l_unit   TO <unit>.
  LOOP AT <lt_data_std> INTO <ls_data>.    "  loop
    CALL METHOD lo_conv->convert_output.      "end of "wis240605
*     fill outtab
    ASSIGN COMPONENT if_uc_model=>gc_type_comp_s_char
    OF STRUCTURE <ls_data> TO <ls_data_cop>.
    MOVE-CORRESPONDING <ls_data_cop> TO <ls_data_out>.
    ASSIGN COMPONENT if_uc_model=>gc_type_comp_s_kfig
    OF STRUCTURE <ls_data> TO <ls_data_cop>.
    MOVE-CORRESPONDING <ls_data_cop> TO <ls_data_out>.
    IF ct_task = c_task01 OR ct_task = space . "'it can be T2700 or blank
*****  aggregate the transactionaldata for given Rules  *****
      ASSIGN COMPONENT : <comp>   OF STRUCTURE <ls_data_out> TO <comp1>,
                         <cgcomp> OF STRUCTURE <ls_data_out> TO <cgcomp1>,
                         <pcomp>  OF STRUCTURE <ls_data_out> TO <pcomp1>,
                         <doct>   OF STRUCTURE <ls_data_out> TO <doct1>,
                         <invc>   OF STRUCTURE <ls_data_out> TO <invc1>, "added by Asif M.
                         <plevel> OF STRUCTURE <ls_data_out> TO <plevel1>,
                         <tc>     OF STRUCTURE <ls_data_out> TO <tc1>,
                         <qty>    OF STRUCTURE <ls_data_out> TO <qty1>,
                         <trn_lc> OF STRUCTURE <ls_data_out> TO <trn_lc1>.
**** 1st Rule ****
* dont include records where '/1FB/CS_TRN_QTY' and '/1FB/CS_TRN_LC' are blank
      IF <trn_lc1> = 0 AND <qty1> = 0.
        CONTINUE.
      ENDIF.
**** 2nd Rule ****
* delete the Posting levels if it is > 1 and clear to blank  CS_PLEVEL
      CHECK <plevel1> LE 1.
      CLEAR <plevel1>.
**** 3rd Rule ****
* replace the Unilever Company with CG without prefix G and compare with Partner comp for deletion
* /BIC/ZCS_COMP with   /1FB/SEM_CGCOMP and check with /BIC/ZCS_PCOM
      IF ct_task <> space.
***  code added by Ramesh for the removal GBRNCH  records while downloading the file.
**** code for removal of GBRNCH records only - Hardcode - sample code
*        IF <cgcomp1> <> 'GBRNCH'.   " to avoid BRNCH records
** replace Company with CG without prefix G when task name is not blank
*          <comp1> = <cgcomp1>+1.
*        ELSE.
*          CONTINUE.
*        ENDIF.
**** code for removal of GBRNCH records only - Hardcode - sample code
***  the assumption here,is consider only records with Legal entity as numeric excepting the first character
        IF <cgcomp1>+1 CN sy-abcde.   " to avoid BRNCH records
* replace Company with CG without prefix G when task name is not blank
          <comp1> = <cgcomp1>+1.
        ELSE.
          CONTINUE.
        ENDIF.
      ENDIF.
* removing leading zero's as SAP sometimes adding them to <pcomp1>.
*      CALL FUNCTION 'CONVERSION_EXIT_ALPHA_OUTPUT'
*        EXPORTING
*          input  = <pcomp1>
*        IMPORTING
*          output = <pcomp1>.
      PERFORM f_alpha_conversion USING <comp1>
                                      CHANGING <comp1>.
      PERFORM f_alpha_conversion USING <pcomp1>
                                 CHANGING <pcomp1>.
      " removing leading zero's from Investee Unit company - Added By Asif Maqbool, IBM/Unilever, 25/01/2008.
      PERFORM f_alpha_conversion USING <invc1>
                                 CHANGING <invc1>.
      CHECK <comp1> <> <pcomp1>.
**** 4rth Rule ****
* initialise Document type & PV TC to blank   /BIC/ZCS_DOCT & /1FB/CS_TRN_TC
      CLEAR: <doct1>,<tc1>.
    ENDIF.
    COLLECT: <ls_data_out> INTO <lt_data_out>.
  ENDLOOP.          " end loop
  IF <lt_data_out> IS INITIAL.
    PERFORM f_build_msgs USING 'UCM0'
                               'W'
                               '053'
                               text-102
                               space "ct_task
                               space
                               space
                      CHANGING ct_message.
    RETURN.
    MESSAGE e208(00) WITH text-102.
    EXIT.
  ENDIF.
* perform various steps based on task name
  CASE ct_task.
    WHEN c_task01 OR space.              " 'T2700' or blank
* download the data into a tab delimited file
****             start of Task 0001              ****
* create Line-structure of download table
      CREATE DATA ls_download TYPE ty_download.
      ASSIGN ls_download->* TO <ls_download>.
** create Download data internal table for task T2700
      CREATE DATA lt_download LIKE STANDARD TABLE OF <ls_download>.
      ASSIGN lt_download->* TO <lt_download>.
      LOOP AT <lt_data_out> INTO <ls_data_out>.
        MOVE-CORRESPONDING <ls_data_out> TO <ls_download>.
        ASSIGN COMPONENT <trn_lc> OF STRUCTURE <ls_download> TO <trn_lc1>.
*** 6th Rule **********************
        " Check for values, if present remove decimals, if not present clear it of (blank).
        UNASSIGN <qty1>.
        ASSIGN COMPONENT <qty> of STRUCTURE <ls_download> to <qty1>.
        ASSIGN COMPONENT <unit> of STRUCTURE <ls_download> to <unit1>.
        if <unit1> = '' OR <unit1> <> '%'.
          REPLACE ALL OCCURRENCES OF '.' in <qty1> WITH '' RESPECTING CASE.
          <qty1> = ''.
        endif.
        if <unit1> <> '' And <qty1> <> ''.
          <unit1> = ''. " We dont need unit downloaded.
          REPLACE ALL OCCURRENCES OF '.' in <qty1> WITH '' RESPECTING CASE.
          <qty1> = <qty1>+0(2).
        endif.
**** 5th Rule ****
* Move the Negative sign to front
        PERFORM f_put_sign_in_front CHANGING <trn_lc1>.
        INSERT <ls_download>  INTO TABLE <lt_download>.
      ENDLOOP.
* move the aggregated data to final table for display
      FREE ct_data.
      ct_data = <lt_data_out>.
      CLEAR: l_path,l_filename,l_fullpath,l_action.
      CALL FUNCTION 'GUI_FILE_SAVE_DIALOG'
       EXPORTING
         window_title            = 'Download aggregated BCS data to Tab Delimited file'
         default_extension       = 'txt'
*   DEFAULT_FILE_NAME       = dynamic file name as like ALE settings
         file_filter             = 'Text files (*.txt)'
       IMPORTING
         filename                = l_filename
         path                    = l_path
         fullpath                = l_fullpath
         user_action             = l_action .
      CALL METHOD cl_gui_cfw=>flush.
      " *************************** START OF CHANGE - ASIF MAQBOOL ************************
      IF l_action = 0 OR l_action = 1.
        ASSIGN gt_param TO <gt_param>.
        APPEND '100' to l_t_tab.
        READ TABLE gt_param INDEX 6 INTO gs_param.
        ASSIGN COMPONENT 2 OF STRUCTURE gs_param to <gs_value>.
        APPEND <gs_value> to l_t_tab.
        Clear gs_param.
        READ TABLE gt_param INDEX 4 INTO gs_param.
        ASSIGN COMPONENT 2 OF STRUCTURE gs_param to <gs_value>.
        APPEND <gs_value> to l_t_tab.
*        LOOP AT <gt_param> INTO gs_param.
*          ASSIGN COMPONENT 1 OF STRUCTURE gs_param to <gs_fieldname>.
*          CASE <gs_fieldname>.
*             WHEN '/BIC/ZFB_VERS'.
*              APPEND '100' to l_t_tab.
*             WHEN 'FISCPERIOD'.
*                ASSIGN COMPONENT 2 OF STRUCTURE gs_param to <gs_value>.
*                APPEND <gs_value> to l_t_tab.
*             WHEN 'FISCYEAR'.
*                ASSIGN COMPONENT 2 OF STRUCTURE gs_param to <gs_value>.
*                APPEND <gs_value> to l_t_tab.
*              WHEN OTHERS.
*                ENDCASE.
*        ENDLOOP.
        CONCATENATE LINES OF l_t_tab INTO str1 SEPARATED BY cl_abap_char_utilities=>horizontal_tab.
        CLEAR l_t_tab.
        INSERT str1 INTO TABLE l_t_tab.
        ASSIGN l_t_tab TO <final_gt>.
        "  To Start by adding the Header Data.
        CALL METHOD cl_gui_frontend_services=>gui_download
          EXPORTING
            filename              = l_fullpath
            write_field_separator = l_seperator "SPACE
          CHANGING
            data_tab              = <final_gt>
          EXCEPTIONS
            file_write_error      = 1.
        " Now append the Data after the header data insertion.
        CALL METHOD cl_gui_frontend_services=>gui_download
          EXPORTING
            filename                = l_fullpath
            write_field_separator   = l_seperator "SPACE
            append                  = 'X'
          CHANGING
            data_tab                = <lt_download>
          EXCEPTIONS
            file_write_error        = 1
            no_batch                = 2
            gui_refuse_filetransfer = 3
            invalid_type            = 4
            no_authority            = 5
            unknown_error           = 6
            header_not_allowed      = 7
            separator_not_allowed   = 8
            filesize_not_allowed    = 9
            header_too_long         = 10
            dp_error_create         = 11
            dp_error_send           = 12
            dp_error_write          = 13
            unknown_dp_error        = 14
            access_denied           = 15
            dp_out_of_memory        = 16
            disk_full               = 17
            dp_timeout              = 18
            file_not_found          = 19
            dataprovider_exception  = 20
            control_flush_error     = 21
            not_supported_by_gui    = 22
            error_no_gui            = 23
            OTHERS                  = 24.
        " *************************** END OF CHANGE - ASIF MAQBOOL ************************
        IF sy-subrc <> 0.
*          MESSA

Hi,
I am also from same project.
We are facing a problem with this code.
How can I increase the length of the field obtained by this method.
CALL METHOD go_model->create_data_reference
    EXPORTING
      io_tx_data_io_type = go_model->ds_tx_data_io_type-totals
      i_type             = l_outtype "'UCR_SX_TX_DATA_LST'
    IMPORTING
      er_data            = lr_s_data_out.
ASSIGN lr_s_data_out->* TO <ls_data_out>.
We are getting data overflow error when we try to move some large value to one of the field in <ls_data_out>.
we can avoid this if the field length is increased.
Waiting for your reply.
Regards
Madhu G S

Similar Messages

  • How can i use a breakpoint on the first project ?

    This is a screenshot of my solution with two projects.
    But the breakpoint will work only on the second one the TestScreenshot but i want to be also to use a breakpoint/s on the Capture project. Tried to make that the Capture will be scope Scope to This but it didn't change anything.

    It's not in a release mode.
    The first project the upper one the Capture is set to class library and Active (debug)  Active (Any cpu) Any cpu
    The second project the TestScreenshot is windows application Active (debug)  Active (Any cpu) Any cpu
    I can use a breakpoint/s on the TestScreenshot but can't use breakpoint/s on the class library project.

  • New install of NWDS. Build error on creation of first project

    Hi,
    NWDS has just been installed. The first project I've created is essgbpdata, on the initial build I'm getting these errors.
    I have jsdk1.4.2_19 installed.
    Any help appreciated.
    DC Model check:
       All used DCs are available locally
       validating dependency to build plugin "sap.com/tc/bi/bp/webDynpro"
       validating dependency to  public part "default" of DC "sap.com/tc/col/api"
       validating dependency to  public part "default" of DC "sap.com/tc/cmi"
       validating dependency to  public part "default" of DC "sap.com/tc/ddic/ddicruntime"
       validating dependency to  public part "default" of DC "sap.com/tc/ddic/metamodel/content"
       validating dependency to  public part "default" of DC "sap.com/tc/wd/webdynpro"
       validating dependency to  public part "default" of DC "sap.com/tc/logging"
       validating dependency to  public part "default" of DC "sap.com/tc/wdp/metamodel/content"
       validating dependency to  public part "default" of DC "sap.com/com.sap.aii.proxy.framework"
       validating dependency to  public part "default" of DC "sap.com/com.sap.aii.util.misc"
       validating dependency to  public part "default" of DC "sap.com/com.sap.exception"
       validating dependency to  public part "default" of DC "sap.com/com.sap.mw.jco"
       validating dependency to used DC "sap.com/pcui_gp/xssfpm"
       validating dependency to used DC "sap.com/pcui_gp/xssutils"
       validating dependency to used DC "sap.com/ess/per"
       DC model check OK
    Preparing data context..
    No public part descriptor found for component "tc/col/api" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/cmi" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/ddic/ddicruntime" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/ddic/metamodel/content" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/wd/webdynpro" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/logging" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "tc/wdp/metamodel/content" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "com.sap.aii.proxy.framework" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "com.sap.aii.util.misc" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "com.sap.exception" (vendor "sap.com"), public part "default", using legacy mode.
    No public part descriptor found for component "com.sap.mw.jco" (vendor "sap.com"), public part "default", using legacy mode.
    No 'default' JDK defined, will use running VM.
    Data context preparation finished in 0.172 seconds
         [wdgen] [Info]    Generating packages/com/sap/xss/hr/per/gb/personal/model/Hcmt_Bsp_Pa_Gb_R0002.java
         [wdgen] WARNING: Metadata of component VcPerPersonalGbDetail is not valid! ComponentUsage "//WebDynpro/Component:com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail/ComponentUsage:FcPersInfo", Role "UsedComponent": A minimum of 1 object(s) is required
         [wdgen] WARNING: Metadata of component VcPerPersonalGbReview is not valid! ComponentUsage "//WebDynpro/Component:com.sap.xss.hr.per.gb.personal.review.VcPerPersonalGbReview/ComponentUsage:FcPersInfo", Role "UsedComponent": A minimum of 1 object(s) is required
         [wdgen] WARNING: Metadata of component VcPerPersonalGbOverview is not valid! ComponentUsage "//WebDynpro/Component:com.sap.xss.hr.per.gb.personal.overview.VcPerPersonalGbOverview/ComponentUsage:FcPersInfo", Role "UsedComponent": A minimum of 1 object(s) is required
         [wdgen] WARNING: Metadata of component FcPerPersonalGb is not valid! ComponentUsage "//WebDynpro/Component:com.sap.xss.hr.per.gb.personal.fc.FcPerPersonalGb/ComponentUsage:FcPersInfo", Role "UsedComponent": A minimum of 1 object(s) is required
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> Component VcPerPersonalGbDetail: Has invalid component usage 'FcPersInfo'
         [wdgen] [Error]   .FutureDay: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   .FutureDay.isRadiobuttonVisible: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute isRadiobuttonVisible [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   .FutureDay.As_of_radiobutton: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   .FutureDay.As_of_radiobutton.Value: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute Value [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   .FutureDay.As_of_radiobutton.Text: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute Text [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   .FutureDay.As_of_radiobutton.isBegdaVisible: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute isBegdaVisible [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   .Subtypes: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextModelNode Subtypes [modelClass]: The context model node has not been bound to a model class (Hint: A Context model node has to be bound to a model class or mapped to a model node of another controller.)
         [wdgen] [Error]   .Subtypes.Subtype: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   .Subtypes.Case: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   .Subtypes.Stext: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   .Default_Begda: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextModelAttribute Default_Begda [referencedProperty]: The context model attribute has not been bound to a model property
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextModelAttribute Default_Begda: Context model attributes which are defined as top level attributes have to be mapped to attributes of other controllers.
         [wdgen] [Error]   .Begda: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute Begda [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   .Endda: The mapping definition is inconsistent, the mapped context element does not exist.
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> ContextValueAttribute Endda [type]: Type missing (Hint: The type property must be set to a simple type, a built in type or any java native type)
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.VcPerPersonalGbDetail --> Component VcPerPersonalGbDetail [FcPersInfo]: Component usage has no used component
         [wdgen] [Warning] com.sap.xss.hr.per.gb.personal.detail.DetailView --> Controller DetailView: Found orphaned translatable text "Back button" not belonging to any development object (Hint: Execute "repair texts" action for project WebDynpro)
         [wdgen] [Warning] com.sap.xss.hr.per.gb.personal.detail.DetailView --> Controller DetailView: Found orphaned translatable text "Cancel button" not belonging to any development object (Hint: Execute "repair texts" action for project WebDynpro)
         [wdgen] [Warning] com.sap.xss.hr.per.gb.personal.detail.DetailView --> Controller DetailView: Found orphaned translatable text "Next button" not belonging to any development object (Hint: Execute "repair texts" action for project WebDynpro)
         [wdgen] [Error]   com.sap.xss.hr.per.gb.personal.detail.DetailView --> TextView TextView_83 [text]: Context element and property are not compatible
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TransparentContainer Space [Children]: Container does not contain children
         [wdgen] [Warning] com.sap.xss.hr.per.gb.personal.detail.DetailView --> Label Gender_Label [labelFor]: Value is not valid
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TransparentContainer Space_12 [Children]: Container does not contain children
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TextView TextView_83: UIElement does not have a label
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TextView Name_Data_Title: UIElement does not have a label
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TextView HR_Data_Title: UIElement does not have a label
         [wdgen] [Info]    com.sap.xss.hr.per.gb.personal.detail.DetailView --> TextView Marital_Status_Title_Label: UIElement does not have a label
         [wdgen] [Info]    Catching throwable null
         [wdgen] [Info]    com.sap.webdynpro.generation.ant.GenerationAntTaskError
         [wdgen] ERROR: Unknown exception during generation null (com.sap.webdynpro.generation.ant.GenerationAntTaskError)
         [wdgen] ERROR: Generation failed due to errors (0 seconds)
    Error: C:\Documents and Settings\rradam\.dtc\0\DCs\sap.com\ess\gb\pdata\_comp\gen\default\logs\build.xml:97: [Error]   Generation failed!
                    at com.sap.webdynpro.generation.ant.WDGenAntTask.execute(WDGenAntTask.java:254)
                    at org.apache.tools.ant.UnknownElement.execute(UnknownElement.java:275)
                    at org.apache.tools.ant.Task.perform(Task.java:364)
                    at org.apache.tools.ant.Target.execute(Target.java:341)
                    at org.apache.tools.ant.Target.performTasks(Target.java:369)
                    at org.apache.tools.ant.Project.executeTarget(Project.java:1214)
                    at com.sap.tc.buildplugin.techdev.ant.util.AntRunner.run(AntRunner.java:116)
                    at com.sap.tc.buildplugin.DefaultAntBuildAction.execute(DefaultAntBuildAction.java:58)
                    at com.sap.tc.buildplugin.DefaultPlugin.handleBuildStepSequence(DefaultPlugin.java:196)
                    at com.sap.tc.buildplugin.DefaultPlugin.performBuild(DefaultPlugin.java:168)
                    at com.sap.tc.buildplugin.DefaultPluginV3Delegate$BuildRequestHandler.handle(DefaultPluginV3Delegate.java:66)
                    at com.sap.tc.buildplugin.DefaultPluginV3Delegate.requestV3(DefaultPluginV3Delegate.java:48)
                    at sun.reflect.NativeMethodAccessorImpl.invoke0(Native Method)
                    at sun.reflect.NativeMethodAccessorImpl.invoke(NativeMethodAccessorImpl.java:39)
                    at sun.reflect.DelegatingMethodAccessorImpl.invoke(DelegatingMethodAccessorImpl.java:25)
                    at java.lang.reflect.Method.invoke(Method.java:324)
                    at com.sap.tc.buildtool.v2.impl.PluginHandler2.maybeInvoke(PluginHandler2.java:350)
                    at com.sap.tc.buildtool.v2.impl.PluginHandler2.request(PluginHandler2.java:99)
                    at com.sap.tc.buildtool.v2.impl.PluginHandler2.build(PluginHandler2.java:73)
                    at com.sap.tc.buildtool.PluginHandler2Wrapper.execute(PluginHandler2Wrapper.java:59)
                    at com.sap.tc.devconf.impl.DCProxy.make(DCProxy.java:1750)
                    at com.sap.tc.devconf.impl.DCProxy.make(DCProxy.java:6004)
                    at com.sap.ide.eclipse.component.provider.actions.dcproject.BuildAction.buildDCsForDevConfig(BuildAction.java:307)
                    at com.sap.ide.eclipse.component.provider.actions.dcproject.BuildAction.access$200(BuildAction.java:58)
                    at com.sap.ide.eclipse.component.provider.actions.dcproject.BuildAction$1.run(BuildAction.java:212)
                    at org.eclipse.jface.operation.ModalContext$ModalContextThread.run(ModalContext.java:101)
    Ant runtime 2.062 seconds
    Ant build finished with ERRORS
    [Error]   Generation failed!
    Error: Build stopped due to an error: [Error]   Generation failed!

    Try Repair -> project Structure and ClassPath
    When you say "The first project I've created is essgbpdata"
    I believe you refer to first importing project DC from NWDI.
    Then you are creating the project...right ?
    If yes, then have you set proper dependencies in NWDI ?
    refer to SAP note : 872892

  • Doing first project with film. EDL questions.

    So I'm doing my first project with Super16 in a month or two and I've got a couple of questions. The workflow will be shoot on 16 > edit in 24p DV > finish on film. I know how to do almost everything right up until we finish editing, but actually getting all the information ready to do a negative cut is something I don't know about. How does Cinema Tools factor into this? What do I need to do about the audio? What sort of windowburn or keycode information do I need to have? Do I do anything different when I import the 24p DV footage? Your help is greatly appreciated.

    I have not done what you are attempting, but my understanding is that you should get flex files to bring into Cinema Tools that reflect the keycode/timecode relationship created in telecine. From there you can export a cutlist that should give you keycodes that the neg cutter can work from.
    Have you read the manual for Cinema Tools?
    Patrick

  • Newbie - First Project with SAP Team... Monitoring Solutions/Strategy?

    I just started my first job out of school two weeks ago. My first project is to work on a "monitoring strategy" for our large SAP enterprise system. We have CRM, SRM, ERP, Sol Man, EDOS, XI, etc... I am supposed to dig into each of these portions of SAP and determine what may need monitored and how to set that up... Does anyone have any ideas of how I should get started? I am new to SAP but have a decent high level understanding of it. Any help would be appreciated. Thanks

    The first thing about being a newbie (welcome though!) to monitoring questions at SDN is that you need to read the "rules of engagement" first.
    These clearly state:
    >- Please do not Cross post.
    > Post your question in the most appropriate forum; not multiple forums. This is bad netiquette and will might only aggravate potential repliers.
    Well, as this NW Admin forum is the most appropriate one and the other 5 which you have cross-posted to are (in my opinion) not, I will not lock this thread here. Most likely your other threads will be deleted or locked by other moderators though.
    Please also read the rest of the rules by end of week three... which explain further about what is monitoried in the forums...
    Cheers,
    Julius

  • Getting started. My first project presents a blank IE page

    Hello! I just download the Studio Creator and followed the steps in the tutorial to get my first project done. When I press Ctrl+F5 to excute it. A web browse opens up but the page is blank. I do a view source code and I can the XML used to create the jsp page but still can't see anything. Has anybody else seen this problem? Any ideas what am I doing wrong?

    Hi!
    What do You want to see? Did You add some components to the page?
    By the way, did You try another browser?
    And one advise: download NetBeans 6.0 from http://www.netbeans.org and You also will be able to create Visual Web Application, but with more advanced IDE.
    Thanks,
    Roman.

  • First project with 16:9 film

    I am doing my first project with film that was captured using the 16:9 mode on my sony camera. My question is if I have to do anything different when importing this footage from the DV tapes to FCE? I noticed there are many posts on this but just want to make sure I am taking the right steps. Thanks.

    Anamorphic refers 16:9 and has nothing to do with audio. 32K is the audio sample rate. FireWire Basic should only be used with Canon cameras.
    You can select the captured items and in the Anamorphic browser column check them to tell the application the material is supposed to be treated as 16:9.
    Also make sure you make a new sequence that's in the correct widescreen aspect after you've changed to the correct settings.

  • Lost Audio; Story of First Project

    I've enjoyed reading the experiences people have posted about their first project in FCP X, so here's mine... (via Dropbox). I've never used FCP, but have been using iMovie. As a newbie, I found I have three advantages over more experienced users:
    - I don't have to unlearn FCP.
    - My iMovie experience was a real plus.
    - The missing pieces of FCP X that are important to many, do not impact my start at the bottom of the learning curve.
    I have run into one serious problem since I wrote my article for our AppleGram: In moving some Events and Projects, using FCP X, I've lost all the audio in both files, except for some audio source files in Events. Any help will be appreciated...
    Bye R@y
    Link

    Hey guys, these questions are very helpful, guiding me to better explain what is going on/not going on!
    No audio is not playable in clips, either event or project, play or skim.
    Yes, I see waveforms both places.
    DB level was set to 0 db and still looks correct.
    No RED icon for audio.
    Yes, this project played perfectly and was exported successfully; trouble began when I moved it.
    No, audio is not detached from video.
    Yes, see the waveforms fine.
    BTW, I'm now on my 2nd install of FCP X; on the first install I NEVER had audio in Events, but it was OK in Projects.  After the "move" that started all the trouble, same problem in both Events and Projects.
    Thanks again!
    Bye R@y

  • First project completed with FCPX Music Video

    I just finished up my first project with FCPX
    Its a music video for one of my songs.
    I shot and edited the video myself with the help of wife and daughter. The video has since gone off to
    a video production house, to transfer to broadcast format for here in Australia (digital beta) and its on its way to TV stations for broadcast.
    I have very very little experience with video, and had only just gotten FCPX a couple of weeks before along with
    the new canon hfs 20 which i used to shoot the video. It was a whirlwind learning curve 8).
    I learned plenty about what not to do the next time I make one. 8)
    I got some really great help here on the forum and wanted to say thanks, I wouldnt have been able to do it without it.
    www.ozlandmusic.com
    is my website where you can see the video.
    I have no previous experience as I said with video editing, before FCPX and found the process reasonably intuitive.
    It was great to be able to sync the video and audio together..and the effects in FCPX were easy to use, as was keyframing which
    i didnt even know existed a couple of weeks back 8)
    I really like the product. I am happy with how the video turned out, and I am looking forward to making a better one next time.
    Again thanks for the help
    cheers
    Wiz

    Thanks everyone for the kind words.
    re first bit of video editing...8)
    well, I had used iMovie a couple of times to transfer VHS tapes to DVD and sony home studio once about 4 years ago, and I used windows movie maker once.... but I had never done any "editing" so I take your comment as a compliment.
    I literally have no more experience than that.  I guess its a testament to how easy FCPX is to use for someone new. I found the things like keyframing, very intuitive, and I have a strong audio background (logic, cubase, sonar etc) and have run a recording studio for many years. So I applied the same sort of techniques to video ediiting, eg look at other peoples work, and try and work out how they do what they do, and then try and duplicate it. There are a wealth of training videos available, and I watched a heap of those, within the first couple of weeks (you tube videos) about how to do things like keyframing, color correction, effects, transform etc.
    I certainly am not trying to portray myself as a newbie, whilst secretly having years of experience.  I honestly only just started and I hope you can take me at face value.
    Just wanted to clear that up.
    Again thanks everyone for your support and well wishes. Perhaps some day I can repay some of that to the group.
    cheers
    Wiz

  • URL Opens only the first Project in an Area

    Hello All,
    RoboHelp Server 8 & RoboHelp 8
    I am getting ready to have our developers redirect our online help to RH Server instead of where it is currently housed.  I am interested in using the shortened URL:
    http://<server-name>/robohelp/server?prj=<project-name>&area=<area-name>
    I have two projects in each area.  When I test the URL for the first project in an area, it works successfully.  However, when I test the URL for the second project in the same area, it only re-opens the first project.  For example:
    http://help.acme.com/robohelp/server?prj=Project1&area=Area1
    http://help.acme.com/robohelp/server?prj=Project2&area=Area1
    So when I click the Project1, it opens and is correctly pulling the right help.  Clicking the second URL, opens up Project1 instead of Project2 as it is supposed to.
    It is like it only reads the first project in an area.  Is it cacheing somewhere?  Flushing DNS and clearing history doesn't do anything.
    Someone please tell me the obvious mistake I am sure I am making.
    Thanks in advance.
    Julie

    OK I think I have a solution to your problem. It appears that the issue is with the underscores in your project names. If you remove them you'll be OK to host both projects in the same area. Just rename your projects in RoboHelp and republish. You'll have to delete the old projects from the Web Administrator though.
    If this works, and I've tested it myself so it should, may I ask you to submit a bug report to Adobe using the link below:
    http://www.Adobe.com/cfusion/mmform/index.cfm?name=wishform&product=38
      The RoboColum(n)
      @robocolumn
      Colum McAndrew

  • Newbie:  My first project.  Is my workflow correct?

    I'm a newbie, working with After Effects for only a few hours. I want to make sure I'm doing things properly. I started with baby steps with my first project as follows:
    I created a 9 second composition and added a single photograph to it.
    I see that AE comes with some cool animated backgrounds like "Apparition". I want that as my background. 
    Now, I'm asking myself, "how do I add this background to my composition?". Well I double-clicked on it to see what would happen. It seems to have replaced my photo. Not what I wanted.  Oops! 
    I had to wonder if there was some attribute within my photo layer that would allow me to add an animated background, but I could not find anything like this.
    Then I wondered, "do I have to make the animated background it's own layer?". If so, how? 
    The only way I could figure out how to do this was by adding a solid color layer below my photo, then double-clicking "Apparition". This created the background I wanted. But is this the correct way to do this?
    OK, now I added a second photo and want it's background different, like the "Cinders" background. And I want this photo duration to be 6 seconds.
    When I added my second photo (photo 2), I had the CTI at the start, so photo 2 starts at the same time as photo 1, not what I wanted. I also discover that my timeframe does not extend beyond 9 seconds. Now what do I do?
    OK, I set the composition to 15 seconds via Composition Settings. Then I drag my photo 2 layer bar I guess you call it, to start at the end of photo 1. Now I position the CTI at the start of photo 2 and add a solid color layer below it.
    To my surprise, the solid color layer starts at zero, not at the CTI!   So, now I have to drag it over to line up with photo 2. Isn't there a better way? Anyway, I add the "Cinders" background and now have what I want.
    Now I start to figure that a $1,000 program should have all kinds of features to aid you in the creation of videos. I find the Keyframe Assistant! Wow, let me start playing with this! 
    I delete photo 2 and its background, leaving just photo 1 and its background. I add photo 2 back again to the composition. Then I run the Keyframe Assistant with no overlap.
    First I notice that my composition is not long enough to contain all of my layers, so I change the composition duration to 1 minute. OK, I see that the Keyframe Assistant shifted all the layers, each layer starting where the previous one ended. So I grab photo 1's background layer and drag it back to where it is supposed to be. The lesson to be learned here, I guess, is that you add your photos first, use the Keyframe Assistant, then add your backgrounds.
    Then I notice something peculiar with photo 2's duration! It looks longer than photo 1's duration. Then I try, without avail, to quickly ascertain the duration of photo 2. I right-click on the bar hoping to see an option to view the layer duration.  Nope, not there!  The only way I know how to do this is by tediously looking at the start and end points of the bar in relation to the timeline. Isn't there an a easier way?
    I find out that the duration of photo 2 is 15 seconds, the duration of the entire composition. So now I remember that when you add a photo, it's duration will match the composition settings duration that you set. So, for every layer that you create, do you have to go back to the Composition Settings and set the desired duration for that layer?
    I'm learning a lot, but is my workflow correct, or are there much easier ways to accomplish the same thing?

    I strongly recommend that you begin at the beginning and start here to learn After Effects.
    Regarding some of your specific questions:
    > Then I wondered, "do I have to make the animated background it's own layer?".
    Yes.
    The reason that the Apparition animation replaced the image in your layer was that you had the layer selected when you double-clicked the animation preset. This applied the animation preset to the layer. If you make sure that you don't have any layers selected when you double-click the animation preset, this will create a new layer and apply the animation preset to the new layer. Or you could create a new solid, as you did, and apply the animation preset to that layer.
    Here's some basic information about animation presets.
    > To my surprise, the solid color layer starts at zero, not at the CTI!
    See the first note on this page, which describes the Create Layers At Composition Start Time preference.
    > Then I notice something peculiar with photo 2's duration! It looks
    longer than photo 1's duration. Then I try, without avail, to quickly
    ascertain the duration of photo 2. I right-click on the bar hoping to
    see an option to view the layer duration.  Nope, not there!  The only
    way I know how to do this is by tediously looking at the start and end
    points of the bar in relation to the timeline. Isn't there an a easier
    way?
    Select the layer and look in the Info panel. Duration is given there.
    > So, for every layer that you create, do you have to go back to the
    Composition Settings and set the desired duration for that layer?
    No.
    "The Still Footage preference setting (Preferences > Import) controls the default duration of layers that use still footage items as their sources. By default, when you create a layer with a still image as its source, the duration of the layer is the duration of the composition. You can change the duration of the layer after it’s created by trimming the layer. "
    (from After Effects Help)
    Again, I strongly urge you to begin at the beginning and start here to learn After Effects. Work your way through the basic materials first. It makes everything else so much easier.

  • Error while creating my first  project on SP15 and why Help doesn't work?

    Hello sdnrs,
    I have a fresh SP15 installtion.
    I have 2 problems creating my first webdynpro project.
    1.When I go to file-new-project-webdynpro->(enter name)->next ,  I have windows poped up with the following error:
    Plug in name: Web Dynpro Archive Builder
    Plug in id: com.sap.ide.webdynpro.archivebuilder
    class: com.sap.ide.webdynpro.archivebuilder.project.WebDynproStandaloneProjectWizard
    Method: createJavaProject(IProject, IProgressMonitor)
    Message: Problems encountered while setting project description.
    Exeption: org.eclipse.core.runtime.CoreException: Problems encountered while setting project description.
    I am frustrated cause I can't do any step futher...! Is there any special settings on the SDK, Window-Preferences, etc?
    2.My Help doesn't work at all - it used to be (with SP11 slim) when i go - 'Help-SAP was docum-SAP webdynpro appl ' and I had my help window poped up.Now I dont have anything!
    Thank you much in advance!
    Bob

    For your information there's another solution if you don't wanna reinstall your NDS or if the reinstallaion doesn't work.
    The error is in the resources so you have to replace some plugin resources to correct the error. Because of that you need access to the resources from somewhere else.
    1. Go to c:\Documents and Settings\"username"\Documents\SAP\workspace\.metadata\.plugins and replace org.eclipse.core.resources with a "working" resource
    2. Go to C:\Program Files\SAP\JDT\eclipse\plugins and replace org.eclipse.core.resources.win32_2.1.0 and org.eclipse.core.resources_2.1.1 with a "working" resource.
    Restart NDS and it ought to work
    Best regards,
    Ole Mose

  • My first Project Siena APP! - Cooking Utility Belt

    Just started using Project Siena and I built my first app. What a fun experience. There was a bit of a learning curve and some additional documentation would have helped but the forum came through for me.  Here is my app, check it out :)
    Cooking Utility Belt
    Tim

    Doing some more research, I came across this in the free e-book from Microsoft Press, Programming Windows Store Apps with HTML, CSS, and JavaScript (Second Edition):
    For basic licensing and trial enforcement, the good news is that both are effortless: the app doesn’t need to do anything at all! A user cannot acquire your app without going through the Store, and even if he did manage to, he’d have to have a developer
    license to install and run it. Furthermore, because the Store automatically tracks trial periods for apps, Windows will simply not launch an app once the trial is expired. Instead, Windows will redirect the user to the product’s page in the Store where the
    user can purchase a full license.
    What that means to me is that when submitting the app in the store you can select if it's a trial mode or not.
    Although it's not as elegant of a solution with code, at least there isn't a concern of losing functionality when a new version of Siena is released, either!
    Thor

  • First project in CS4 and major issues with preview and such.....experienced with all previous PPRO v

    So to sum it up, I have been working in Premiere since version 4.2. I am familiar with program.
    I decided to test CS4 on a simple project, as I usually work on complex HD videos. I captured a friends wedding, shot by someone else (uncle or aunt) in DV mode. I open a CS4 project in DV NTSC 720x480 and import my clip. This should be a simple edit.
    I drag clips to the timeline and do some very basic dissolves in and out to smooth out the rough cuts of the camera operator. So far so good. I am previewing the video out on my second monitor which happens to be an HDTV via the premiere playback to secondary monitor feature.
    I drag a color correction filter onto a clip and "wham" the preview goes away. Then I turn the effect off and it comes back. When I scrub the timeline, all I see is the first frame of that clip all the way through. It's stuck. I have to build a preview to get it to play. In addition, I cannot see a preview of anything when I am makijng color adjustments except in the small monitor window of Premiere. This is basic editing 101....never had to give it a though before and now basic functionality is going haywire. Ofte images are all negative looking too.
    So I started a new project in HD and setup to preview to second monitor. I created a simple title and dragged it to the timeline. It won't preview to the second monitor at all. A simple title. Only in the little premiere monitor. Then I import a jpg....same thing. I have to build a preview to see anything....
    Then....I have these 2 clips on the timeline, a premiere title butted up against a jpg. With no effects, it now will not even show the title anywhere. During the five seconds of the title, I see the jpg (which is coming up next, but in a negative mode...you know reversed out basically) then when it gets to the jpg it shows. If I change the size of anything....it stops working again until I render.....
    I have to say that in the 45 minutes that I have been trying Cs4, it has behaved so strangely it is scaring me. CS3 has it's quirks but they typically present themselves in huge projects, not brand new ones with 2 clips in them, neither of these are even HD video! Just a title and a jpg.
    Any ideas? I have CS3 production Suite running great. Hopefully I missed a simple new setting or something. Yeah...right.
    Intel Q6600
    4GB Ram
    Nvidia 7950
    2 Terabytes of Raid Drives
    Sound Blaster Audigy Card
    My system is not slow by any means.....
    thanks.

    Jim,
    I have accomplished this with an ATI card also, so it can be done. I am not sure what you are trying to imply. It absolutely works. If you are implying that simply because it doesn't blank the screen out when no video is being played that it is not a true output you are wrong. Are there better more color accurate ways to do this? Sure....for thousands of dollars for SDI or HDMI cards then production grade LCDs I'm sure it could work better.
    My video card outputs a 1920x1080 signal to my HDTV....that I calibrate to the best of its ability considering it is not a production monitor. When in Premiere I get full high res 1920x1080 HD video playing on this monitor looking darn close to what it will look like when rendered to Blu-ray, whereas the image on my awsome 30" Dell LCD is not accurate at all. I mean it looks clean and awesome but is not very close to an HDTV colorwise.
    This absolutely works. As good as it is, it is not as accurate as dedicated equipment and color production monitors.
    To be clear, it is an extension of the desktop, and premiere is able to display the entire resolution of the video over the entire thing.

  • First projects

    My first few projects are done in Illustrator, can you guys give my some comments and also tips to improve? Do you see i've never worked before with illustrator?
    Please look at my banners on my sites: 4you2wear, 4you2scent and 4you2sleep
    Looking forward to hearing from you, please give me your comments! I want to learn....

    Post the banner(s) as an attachment in this forum, so someone will help. At the moment your post looks like a spammer. And odds are no one will help.

Maybe you are looking for