Dummy title

I am trying to log into my bank account through firefox mobile on my i-phone and once I put my username and password it goes to a light blue screen and says - Dummy Title. What is this? Why can't I log into my bank account?

Uhmm, there isn't a Firefox Mobile web browser for the iPhone. <br /> Are you talking about Firefox Home?

Similar Messages

  • Zero Balance title accounts appearing on financial reports

    Hi All
    Is there anyway of not showing a title account with a zero balance when you run a Trial Balance, P&L or a balance sheet.
    I know that you can leave the checkbox unticked in the selection criteria, but this only removes the active accounts from the report.
    Thanks

    Hi Stuart
    A work around is to create a Financial Report Template and set the titles you don't want displayed as "dummy titles". Only problem is when they do have values, the G/L account will display instead of the title. Give it a try and let me know if it helps you.
    Kind regards
    Peter Juby

  • Regarding upload from excel to alv.

    Hi
    here is my code:
    TABLES
    TABLES: ioheader,        " IOC Communication structure
            ioitem,          " IOC Communication structure
            klah,            " Class and Class type
            ksml,            " Characteristic Keys for Class and Type
            cabn,            " Characteristics
            cabnt,           " Characteristic Descriptions
            vbap,            " SAles details
            sscrfields.
    Includes
    INCLUDE rvreuse_global_data.  " ALV Types etc
    DATA - INTERNAL TABLES AND FIELD LISTS
    Types
    TYPE-POOLS: ibco2.           " Characteristic types
    DATA - CONSTANTS
    CONSTANTS: c_true(1)    TYPE c             VALUE 'X',
               c_false(1)   TYPE c             VALUE ' ',
               c_zioheader  TYPE dd02l-tabname VALUE 'ZIOHEADER',
               c_command    TYPE slis_formname VALUE 'USER_COMMAND',
               c_backhoe(7) TYPE c             VALUE 'BACKHOE',
               c_300(3)     TYPE c             VALUE '300',
               c_no_data(7) TYPE c             VALUE 'No Data',
               c_save(1)    TYPE c             VALUE 'A'.
    Internal Tables
    Main IO Table
    DATA: i_header LIKE zioheader OCCURS 0 WITH HEADER LINE.
    Characteristic Values
    DATA: i_config TYPE ibco2_instance_tab2.
    Characteristics Keys
    DATA: BEGIN OF i_imerk OCCURS 0,
            imerk LIKE ksml-imerk,
          END OF i_imerk.
    ALV Grid Control
    DATA: i_grid TYPE sd_alv.
    Catalogues
    DATA: wa_cat LIKE LINE OF i_grid-fieldcat.
    Structures
    Structure for layout variant
    DATA: s_variant LIKE disvariant.
    DATA : filename TYPE string.
    DATA - WORKING VARIABLES
    DATA - FIELD GROUPS
    *field-groups:
    SELECTION SCREEN
    Variant control
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-t02.
    PARAMETERS: p_var LIKE disvariant-variant.
    SELECTION-SCREEN END OF BLOCK b1.
    Printer Control
    SELECTION-SCREEN BEGIN OF BLOCK b3 WITH FRAME TITLE text-t03.
    PARAMETERS: rad1 RADIOBUTTON GROUP rad USER-COMMAND radio,
                rad2 RADIOBUTTON GROUP rad,
                rad3 RADIOBUTTON GROUP rad.
    PARAMETER p_floc(128) DEFAULT '/usr/tmp/testfile.dat'
                             LOWER CASE.
    SELECTION-SCREEN END OF BLOCK b3.
    MAIN PROGRAM *************************
    INITIALIZATION.
      PERFORM initialise.             " Set up program defaults
    move 'Report Only' to rad1.
    move 'Export Sequence List' to s_but2.
    move 'Import Sequence List' to S_but3.
    Selection Screen Options
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_var.
      PERFORM get_variant CHANGING p_var.             " ALV Layout
    DATA :   l_no_of_lines TYPE i,
              la_matnr LIKE s_matnr.
    DESCRIBE TABLE s_matnr LINES l_no_of_lines.
    IF l_no_of_lines > 1.
       MESSAGE e000(z1) WITH 'Enter only one product'.
    ENDIF.
    READ TABLE s_matnr INTO la_matnr WITH KEY sign = 'I'
                               option = 'EQ'.
    IF sy-subrc NE 0.
       MESSAGE e000(z1) WITH 'Enter only one product'.
    ENDIF.
    AT SELECTION-SCREEN.
      DATA :   l_no_of_lines TYPE i,
                la_matnr LIKE s_matnr.
      DESCRIBE TABLE s_matnr LINES l_no_of_lines.
      IF l_no_of_lines > 1.
        MESSAGE e000(z1) WITH 'Enter only one product'.
      ENDIF.
    READ TABLE s_matnr INTO la_matnr WITH KEY sign = 'I'
                                option = 'EQ'.
      IF sy-subrc NE 0.
        MESSAGE e000(z1) WITH 'Enter only one product'.
      ENDIF.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR  p_floc.
    data : pname type syst-repid.
    CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
    EXPORTING
       PROGRAM_NAME        = pname
       DYNPRO_NUMBER       = SYST-DYNNR
       FIELD_NAME          = 'P_FLOC'
      STATIC              = ' '
      MASK                = ' '
      CHANGING
        FILE_NAME           = p_floc
    EXCEPTIONS
      MASK_TOO_LONG       = 1
      OTHERS              = 2
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
    START-OF-SELECTION.
      PERFORM set_catalogue.          " Set up basic headings from Itab
      PERFORM get_char_keys.          " Get the characteristic keys
      PERFORM modify_catalogue_key.   " Amend headings for char keys
    IOC Logical Database Event
      GET ioheader.
      PERFORM get_subsequent_data.    " Retrieve additional data
    END-OF-SELECTION.
    PERFORM modify_catalogue_title. " Place correct titles for AVL
    PERFORM alv_display.            " Display in ALV Grid
    if rad1 = 'X' .
      PERFORM modify_catalogue_title. " Place correct titles for AVL
      PERFORM alv_display.            " Display in ALV Grid
    elseif rad2 = 'X' .
    *if p_floc is initial .
    MESSAGE e000(z1) WITH
       ' Enter the file location'.
    *else.
       PERFORM download.               " Export sequence list to excel
    PERFORM modify_catalogue_title. " Place correct titles for AVL
      PERFORM alv_display.            " Display in ALV Grid
    *endif.
    elseif rad3 = 'X' .
    if p_floc is initial .
    MESSAGE e000(z1) WITH
        ' Enter the file location'.
    else .
         PERFORM upload.
    endif.
    endif.
    *AT SELECTION-SCREEN OUTPUT.
    *TOP-OF-PAGE.
    *END-OF-PAGE.
    *AT USER-COMMAND.
    perform PF_STATUS_SET.
    SUBROUTINES *******************************
          FORM get_variant                                              *
          Retrieve ALV display variant                                  *
    -->  X_VAR Variant                                                 *
    FORM get_variant CHANGING x_var.
      PERFORM f4_alv_layout(ppio_entry) USING i_grid-program
                                     CHANGING x_var.
    ENDFORM.
          FORM get_subsequent_data                                      *
          Retrieve additional data and place into I_HEADER Itab         *
    FORM get_subsequent_data.
    Prime extended table
      i_header = ioheader.
      PERFORM get_serial_number. " Get Sales Order Serial No
      PERFORM get_char_values.   " Get Characteristic Values
      PERFORM build_char_entries." Put Char Values into I_HEADER
    Add to extended table
      APPEND i_header.
    ENDFORM.
          FORM get_serial_number                                        *
          Retrieve the serial number                                    *
    FORM get_serial_number.
      SELECT SINGLE zuonr submi
        INTO (i_header-zuonr,i_header-submi)
        FROM vbak
       WHERE vbeln EQ i_header-kdauf_aufk.
    ENDFORM.
          FORM get_char_values                                          *
          Retrieve the characteristic values for the production order   *
    FORM get_char_values.
    Get Ready
      REFRESH i_config.
    Get Object key
      SELECT SINGLE cuobj
      FROM vbap
      INTO vbap-cuobj
      WHERE vbeln EQ i_header-kdauf_aufk
        AND matnr EQ i_header-plnbez.
    Get characteristic config values
      CALL FUNCTION 'CUCB_GET_CONFIGURATION'
           EXPORTING
                instance                     = vbap-cuobj
           IMPORTING
                configuration                = i_config
           EXCEPTIONS
                invalid_input                = 1
                invalid_instance             = 2
                instance_is_a_classification = 3
                OTHERS                       = 4.
    Not found, no config values will be pulled through
      IF sy-subrc <> 0.
      ENDIF.
    ENDFORM.
          FORM build_char_entries                                       *
          For each character value. Find the relevent "slot" in the     *
          table by checking the characteristic key against the catalogue*
          stored key
    FORM build_char_entries.
      DATA: la_config LIKE LINE OF i_config,       " i_config header line
            li_values TYPE ibvalue0 OCCURS 0,      " Charact'ic Values Itab
            la_values LIKE LINE OF li_values,      " li_values header line
            l_atwrt LIKE la_values-atwrt,          " Characteristic Value
            l_atinn LIKE la_values-atinn,          " Characteristic Key
            l_key(20),                             " Working built key
            l_entry(20),                           " FieldName to be updated
            l_len LIKE sy-tabix,                   " Length of string
            l_tabix LIKE sy-tabix.                 " Index position of Itab
      FIELD-SYMBOLS: <f_field>.       " This will be the field to update
    Loop on characteristics
      LOOP AT i_config INTO la_config.
    Extract the characteristic values imbedded table
        MOVE la_config-values TO li_values.
    Loop on the characteristics values
        LOOP AT li_values INTO la_values.
    We now have the charecteristic key la_values-atinn
    and the value in la_values-atwrt. However, there may be
    Multiple values for key la_values-atinn
    So if they are the same append to one long string.
    Is it a new value
          IF la_values-atinn EQ l_atinn.
            CONCATENATE l_atwrt '|' la_values-atwrt INTO l_atwrt.
            CONTINUE.
          ENDIF.
    New Value (and not first pass) so save built values
          IF NOT l_atinn IS INITIAL.
    Find the correct field to place the value in.
    This is done by finding the Itab field description in the AVL display
    field Catalogue called "No Data|nnnnnn" where nnnn is the
    characteristic Key
    Build the key
            CONCATENATE c_no_data '|' l_atinn INTO l_key.
    Loop till we find it. This gives us the field name
            LOOP AT i_grid-fieldcat INTO wa_cat WHERE seltext_l = l_key.
    Set up the field name to be amended
              CONCATENATE wa_cat-tabname '-' wa_cat-fieldname INTO l_entry.
              ASSIGN (l_entry) TO <f_field>.
    Update field with the Char value
              MOVE l_atwrt TO <f_field>.
    No need to continue this loop
              EXIT.
            ENDLOOP.
          ENDIF.
    Prime for next value
          l_atinn = la_values-atinn.
          l_atwrt = la_values-atwrt.
        ENDLOOP.
      ENDLOOP.
    ENDFORM.
          FORM alv_display                                              *
          Display data in ALV grid                                      *
    FORM alv_display.
    Set up Variant
      i_grid-variant-variant = p_var.     " Variant
      CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
      EXPORTING
      I_INTERFACE_CHECK              = ' '
      I_BYPASSING_BUFFER             =
      I_BUFFER_ACTIVE                = ' '
        i_callback_program             = i_grid-program
       I_CALLBACK_PF_STATUS_SET       =  i_grid-pf_status_set
        i_callback_user_command        = i_grid-user_command
      i_structure_name               = i_grid-structure
      is_layout                      = i_grid-layout
        it_fieldcat                    = i_grid-fieldcat
      IT_EXCLUDING                   = i_grid-excluding
      IT_SPECIAL_GROUPS              = i_grid-special_groups
      IT_SORT                        = i_grid-sort
      IT_FILTER                      = i_grid-filter
      IS_SEL_HIDE                    = i_grid-sel_hide
      I_DEFAULT                      = i_grid-default
        i_save                         = I_grid-save
        is_variant                     = i_grid-variant
      IT_EVENTS                      = i_grid-events
      IT_EVENT_EXIT                  = i_grid-event_exit
      IS_PRINT                       = i_grid-print
      IS_REPREP_ID                   =
      I_SCREEN_START_COLUMN          = i_grid-start_column
      I_SCREEN_START_LINE            = i_grid-start_line
      I_SCREEN_END_COLUMN            = i_grid-end_column
      I_SCREEN_END_LINE              = i_grid-end_line
    IMPORTING
      E_EXIT_CAUSED_BY_CALLER        = i_grid-exit
      ES_EXIT_CAUSED_BY_USER         = i_grid-user_exit
        TABLES
         t_outtab                      = i_header
       EXCEPTIONS
        program_error                  = 1
        OTHERS                         = 2.
    ALV Failed.
      IF sy-subrc <> 0.
        WRITE: / 'Failed with',sy-subrc.
      ENDIF.
    ENDFORM.
          FORM initialise                                               *
          Set up basic report details                                   *
    FORM initialise.
    ALV controls
      i_grid-program = sy-repid.          " Program Name
      i_grid-user_command = c_command.    " ALV user FORM
      i_grid-save = c_save.               " Save Options
    ALV Variant Details for saved report layouts
      i_grid-variant-report = i_grid-program.
      i_grid-variant-username = sy-uname.
    ENDFORM.
          FORM user_command                                             *
          Routine called by ALV                                         *
    -->  X_UCOMM    Function selected                                  *
    -->  X_SELFIELD Selection field Itab                               *
    FORM user_command USING x_ucomm    LIKE sy-ucomm
                            x_selfield TYPE slis_selfield.
      DATA: l_answer(1).        " Answer returned from popup box
    Only allow drill down on Order number
      CHECK x_selfield-fieldname = 'AUFNR'.
    Get option for display or modify
      CALL FUNCTION 'POPUP_TO_DECIDE'
           EXPORTING
                textline1    = 'Please Choose'
                text_option1 = 'Display'
                text_option2 = 'Modify'
                titel        = 'Production Order'
           IMPORTING
                answer       = l_answer.
    Did they cancel
      CHECK l_answer NE 'A'.
    Set up parameters.
      SET PARAMETER ID 'ANR' FIELD x_selfield-value.
    Display
      IF l_answer = '1'.
        CALL TRANSACTION 'CO03' AND SKIP FIRST SCREEN.
    Modify
      ELSEIF l_answer = '2'.
        CALL TRANSACTION 'CO02' AND SKIP FIRST SCREEN.
      ENDIF.
    *IF rad2 = 'X'.
    If sy-ucomm ='%PC'.
    IF sy-subrc <> 0.
        WRITE: / 'Failed with',sy-subrc.
      else.
      CALL FUNCTION 'POPUP_TO_INFORM'
        EXPORTING
          TITEL         = 'File Transfer Status'
          TXT1          = 'File transfered to location:'
          TXT2          = filename
        TXT3          = ' '
        TXT4          = ' '
        ENDIF.
    endif.
    ENDFORM.
          FORM set_catalogue                                            *
          Retrieve the title and field information from the             *
          Data Dictionary. This will then be amended to the correct     *
          Characteristic titles during the end-of-selection event       *
    FORM set_catalogue.
      CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
           EXPORTING
                i_program_name         = i_grid-program
                i_internal_tabname     = 'I_HEADER'
                i_structure_name       = c_zioheader
                i_client_never_display = 'X'
           CHANGING
                ct_fieldcat            = i_grid-fieldcat.
    ENDFORM.
          FORM get_char_keys                                            *
          Retrieve the list of characteristic keys                      *
          template of BACKHOE class 300                                 *
    FORM get_char_keys.
      DATA : la_inob TYPE inob.
      SELECT SINGLE * FROM inob INTO la_inob
                     WHERE objek = s_matnr-low.
      IF sy-subrc NE 0.
        MESSAGE e000(z1) WITH
        ' Could not get INOB table for ' s_matnr-low.
      ENDIF.
    Get Major Object key
      SELECT SINGLE clint
        FROM klah
        INTO klah-clint
       WHERE klart = la_inob-klart
         AND class = s_matnr-low.
      IF sy-subrc NE 0.
        MESSAGE e001(z296) WITH c_backhoe c_300.
      ENDIF.
    Use Major key to retrieve Characteristics keys
    This is the template for the headings
      SELECT imerk
        FROM ksml
        INTO TABLE i_imerk
       WHERE clint EQ klah-clint    " Objct Key
         AND lkenz EQ space         " Delete Indicator
         AND datuv LE sy-datum.     " Validity to
      IF sy-subrc NE 0.
        MESSAGE e002(z296) WITH klah-clint.
      ENDIF.
    ENDFORM.
          FORM modify_catalogue_key                                     *
          Change the default "No Data" titles with the characteristic   *
          key values in the form "No Data|nnnnnnn" where nnnnnn is      *
          the characteristic key. This is used as a method of allocating*
          characteristic values to the I_HEADER Itab positions          *
          CHAR_001 to CHAR_100                                          *
    FORM modify_catalogue_key.
      DATA: l_index LIKE sy-tabix,              " Table Index for Read
            l_tabix LIKE sy-tabix,              " Table Index Position
            l_seltext_l LIKE dd03p-scrtext_l.   " Heading Text
    Get into Key Sequence
      SORT i_imerk.
    Loop on catalogue for dummy titles
      LOOP AT i_grid-fieldcat INTO wa_cat WHERE seltext_l(7) = c_no_data.
        l_tabix = sy-tabix.
    Get the next characteristic
        l_index = l_index + 1.
        READ TABLE i_imerk INDEX l_index.
    No Characteristic, No display
        IF sy-subrc NE 0.
          wa_cat-no_out = c_true.
          wa_cat-tech = c_true.
          MODIFY i_grid-fieldcat FROM wa_cat INDEX l_tabix.
          CONTINUE.
        ENDIF.
    Place the char key against the "No Data" title
    so that later we know what values to place against the keys
    the title will become "No Data:nnnnnnnnnn" (nnn = Key)
        CONCATENATE c_no_data '|' i_imerk-imerk INTO wa_cat-seltext_l.
        MODIFY i_grid-fieldcat FROM wa_cat INDEX l_tabix.
      ENDLOOP.
    ENDFORM.
          FORM modify_catalogue_title                                   *
          At this stage the catalogue titles for the characteristics    *
          are in the form "No Data|nnnnn" Where nnnn is the             *
          characteristic key. Using the Key, replace this text with     *
          the real characteristic title
    FORM modify_catalogue_title.
      DATA: l_key(20),                 " Characteristic Key in Alpha form
            l_len LIKE sy-tabix.       " Length of string
    Loop on the characteristic keys
      LOOP AT i_imerk.
    Get the real title
        SELECT SINGLE atbez
          FROM cabnt
          INTO cabnt-atbez
         WHERE atinn EQ i_imerk-imerk.
    Not found, leave alone
        CHECK sy-subrc EQ 0.
    Place key into char form for comparison in loop
        l_key = i_imerk-imerk.
    Now loop on the catalogue to get the key
        LOOP AT i_grid-fieldcat INTO wa_cat WHERE seltext_l+8 = l_key.
    Place the title into the catalogue
          wa_cat-seltext_l = cabnt-atbez.
          wa_cat-seltext_m = cabnt-atbez.
          wa_cat-seltext_s = cabnt-atbez.
          wa_cat-reptext_ddic = cabnt-atbez.
    And update
          MODIFY i_grid-fieldcat FROM wa_cat.
        ENDLOOP.
      ENDLOOP.
    IF rad2 = 'X'.
    LOOP AT i_grid-fieldcat INTO wa_cat.
    *IF wa_cat-fieldname = 'AUFNR'.
    *wa_cat-col_pos = '10'.
    *endif.
    case wa_cat-fieldname.
    when 'AUFNR'.
    wa_cat-fix_column = 'X'.
    when 'CY_SEQNR'.
    wa_cat-fix_column = 'X'.
    when 'ZOUNR'.
    wa_cat-fix_column = 'X'.
    when 'GLTRP'.
    wa_cat-fix_column = 'X'.
    when 'SUBMI'.
    wa_cat-fix_column = 'X'.
    endcase.
    modify  i_grid-fieldcat FROM wa_cat.
    endloop.
    endif.
    ENDFORM.
    *SELECT z099seqno z099heading
          INTO table i_header
          FROM z099 join z100 ON
          z099seqno = z100seqno WHERE
    z100~product = s_matnr.
    *&      Form  download
          Download file to excel
    *FORM download.
    *filename = p_floc .
    *CALL FUNCTION 'GUI_DOWNLOAD'
    EXPORTING
      BIN_FILESIZE                  =
       FILENAME                      = filename
       FILETYPE                      = 'ASC'
       APPEND                        = 'X'
      WRITE_FIELD_SEPARATOR         = ','
      HEADER                        = 'l_seltext_l'
      TRUNC_TRAILING_BLANKS         = ' '
      WRITE_LF                      = 'X'
      COL_SELECT                    = ' '
      COL_SELECT_MASK               = ' '
      DAT_MODE                      = ' '
    IMPORTING
      FILELENGTH                    =
    TABLES
       DATA_TAB                      = i_header
    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
      OTHERS                        = 22
    IF sy-subrc <> 0.
       WRITE: / 'Failed with',sy-subrc.
    else.
    CALL FUNCTION 'POPUP_TO_INFORM'
       EXPORTING
         TITEL         = 'File Transfer Status'
         TXT1          = 'File transfered to location:'
         TXT2          = filename
        TXT3          = ' '
        TXT4          = ' '
       ENDIF.
    *ENDFORM.                    " download
    *&      Form  upload
          text
    -->  p1        text
    <--  p2        text
    FORM upload.
    *DATA : i_upload TYPE STANDARD TABLE OF alsmex_tabline.
    **data : i_upload like zioheader occurs 0 with header line.
    data file like RLGRAP-FILENAME.
    file = p_floc .
    DATA: BEGIN OF i_upload OCCURS 0.
            INCLUDE STRUCTURE  alsmex_tabline.
    DATA: END OF i_upload.
    DATA: BEGIN OF i_upload1 OCCURS 0.
            INCLUDE STRUCTURE  alsmex_tabline.
    DATA: END OF i_upload1.
    DATA: BEGIN OF t_col OCCURS 0,
           col LIKE alsmex_tabline-col,
           size TYPE i.
    DATA: END OF t_col.
    DATA: zwlen TYPE i,
          zwlines TYPE i.
    DATA: BEGIN OF fieldnames OCCURS 3,
            title(60),
            table(6),
            field(10),
            kz(1),
          END OF fieldnames.
    DATA: tind(4) TYPE n.
    FIELD-SYMBOLS: <fs1>.
    DATA: zwfeld(19).
    CALL FUNCTION 'ALSM_EXCEL_TO_INTERNAL_TABLE'
      EXPORTING
        FILENAME                      = file
        I_BEGIN_COL                   = '1'
        I_BEGIN_ROW                   = '1'
        I_END_COL                     = '200'
        I_END_ROW                     = '6500'
      TABLES
        INTERN                        = i_upload.
    EXCEPTIONS
      INCONSISTENT_PARAMETERS       = 1
      UPLOAD_OLE                    = 2
      OTHERS                        = 3
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    endif.
    LOOP AT i_upload.
        i_upload1 = i_upload.
        CLEAR i_upload1-row.
        APPEND i_upload1.
      ENDLOOP.
      SORT i_upload1 BY col.
      LOOP AT i_upload1.
        AT NEW col.
          t_col-col = i_upload1-col.
          APPEND t_col.
        ENDAT.
        zwlen = strlen( i_upload1-value ).
        READ TABLE t_col WITH KEY col = i_upload1-col.
        IF sy-subrc EQ 0.
          IF zwlen > t_col-size.
            t_col-size = zwlen.
                             Internal Table, Current Row Index
            MODIFY t_col INDEX sy-tabix.
          ENDIF.
        ENDIF.
      ENDLOOP.
      DESCRIBE TABLE t_col LINES zwlines.
      SORT i_upload BY row col.
    IF kzheader = 'X'.
        LOOP AT i_upload.
          fieldnames-title = i_upload-value.
          APPEND fieldnames.
          AT END OF row.
            EXIT.
          ENDAT.
        ENDLOOP.
    ELSE.
        DO zwlines TIMES.
          WRITE sy-index TO fieldnames-title.
          APPEND fieldnames.
        ENDDO.
    ENDIF.
      SORT i_upload BY row col.
      LOOP AT i_upload.
       IF kzheader = 'X'
        i_upload-row = 1.
          CONTINUE.
       ENDIF.
        tind = i_upload-col.
        CONCATENATE 'DATA_TAB-VALUE_' tind INTO zwfeld.
        ASSIGN (zwfeld) TO <fs1>.
        <fs1> = i_upload-value.
        AT END OF row.
          APPEND i_upload.
          CLEAR i_upload.
        ENDAT.
      ENDLOOP.
    if sy-subrc = 0.
    CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
    EXPORTING
      I_INTERFACE_CHECK                 = ' '
      I_BYPASSING_BUFFER                =
      I_BUFFER_ACTIVE                   = ' '
       I_CALLBACK_PROGRAM                = i_grid-program
      I_CALLBACK_PF_STATUS_SET          = ' '
      I_CALLBACK_USER_COMMAND           = ' '
      I_CALLBACK_TOP_OF_PAGE            = ' '
      I_CALLBACK_HTML_TOP_OF_PAGE       = ' '
      I_CALLBACK_HTML_END_OF_LIST       = ' '
      I_STRUCTURE_NAME                  =
      I_BACKGROUND_ID                   = ' '
      I_GRID_TITLE                      =
      I_GRID_SETTINGS                   =
      IS_LAYOUT                         =
       IT_FIELDCAT                       = i_grid-fieldcat
      IT_EXCLUDING                      =
      IT_SPECIAL_GROUPS                 =
      IT_SORT                           =
      IT_FILTER                         =
      IS_SEL_HIDE                       =
      I_DEFAULT                         = 'X'
      I_SAVE                            = i_save
       IS_VARIANT                        = i_grid-variant
      IT_EVENTS                         =
      IT_EVENT_EXIT                     =
      IS_PRINT                          =
      IS_REPREP_ID                      =
      I_SCREEN_START_COLUMN             = 0
      I_SCREEN_START_LINE               = 0
      I_SCREEN_END_COLUMN               = 0
      I_SCREEN_END_LINE                 = 0
      IT_ALV_GRAPHICS                   =
      IT_ADD_FIELDCAT                   =
      IT_HYPERLINK                      =
      I_HTML_HEIGHT_TOP                 =
      I_HTML_HEIGHT_END                 =
    IMPORTING
      E_EXIT_CAUSED_BY_CALLER           =
      ES_EXIT_CAUSED_BY_USER            =
      TABLES
        T_OUTTAB                          = i_upload.
    EXCEPTIONS
      PROGRAM_ERROR                     = 1
      OTHERS                            = 2
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
    endif.
    when i execute the program i am getting a short dump
    GETWA_NOT_ASSIGNED
    what might be the problem.
    this is a very urgent question.
    pls suggest me the clear way to over come this problem.

    HI
    use this code for uploading the excel file to internal table....
    data: begin of itab_string occurs 0,
          record type char255,
          end of itab_string.
    data:  L_FILETABLE TYPE FILETABLE,
    L_FILETAB_H TYPE FILETABLE WITH HEADER LINE.
    data: p_file1 type string.
    selection screen .
    PARAMETERS: P_FILE TYPE LOCALFILE.
    initialization.
    at selection-screen on value-request for P_FILE.
    IF THE USER SELECT EXTENTION BUTTON IT WILL OPEN THE LOCAL DIRECTORY FOR SELECTING THE FILE LOCATION.
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>FILE_OPEN_DIALOG
    EXPORTING
       WINDOW_TITLE            =
       DEFAULT_EXTENSION       = 'CSV'
       DEFAULT_FILENAME        = 'C:\Documents and Settings\196093\Desktop\STATUS.csv'
       FILE_FILTER             =
       INITIAL_DIRECTORY        = 'C:\Documents and Settings\196093\Desktop\'
       MULTISELECTION          =
       WITH_ENCODING           =
      CHANGING
        FILE_TABLE              = L_FILETABLE
        RC                      = RC
       USER_ACTION             =
       FILE_ENCODING           =
      EXCEPTIONS
        FILE_OPEN_DIALOG_FAILED = 1
        CNTL_ERROR              = 2
        ERROR_NO_GUI            = 3
        NOT_SUPPORTED_BY_GUI    = 4
        others                  = 5
    IF SY-SUBRC <> 0.
    ELSE.
    LOOP AT l_filetable INTO L_FILETAB_H.
    P_FILE = L_FILETAB_H-FILENAME.
    move p_file to p_file1.
    EXIT.
    ENDLOOP.
    ENDIF.
    passing the selected file name to gui_upload for loading the data
    into internal table
    CALL FUNCTION 'GUI_UPLOAD'
      EXPORTING
        FILENAME                      = p_file1
      FILETYPE                      = 'ASC'
      HAS_FIELD_SEPARATOR           = ' '
      HEADER_LENGTH                 = 0
      READ_BY_LINE                  = 'X'
      DAT_MODE                      = ' '
      CODEPAGE                      = ' '
      IGNORE_CERR                   = ABAP_TRUE
      REPLACEMENT                   = '#'
      CHECK_BOM                     = ' '
      NO_AUTH_CHECK                 = ' '
    IMPORTING
      FILELENGTH                    =
      HEADER                        =
      TABLES
        DATA_TAB                      = itab_string
    EXCEPTIONS
       FILE_OPEN_ERROR               = 1
       FILE_READ_ERROR               = 2
       NO_BATCH                      = 3
       GUI_REFUSE_FILETRANSFER       = 4
       INVALID_TYPE                  = 5
       NO_AUTHORITY                  = 6
       UNKNOWN_ERROR                 = 7
       BAD_DATA_FORMAT               = 8
       HEADER_NOT_ALLOWED            = 9
       SEPARATOR_NOT_ALLOWED         = 10
       HEADER_TOO_LONG               = 11
       UNKNOWN_DP_ERROR              = 12
       ACCESS_DENIED                 = 13
       DP_OUT_OF_MEMORY              = 14
       DISK_FULL                     = 15
       DP_TIMEOUT                    = 16
       OTHERS                        = 17
    IF SY-SUBRC <> 0.
    MESSAGE I000(Z00) WITH 'PLEASE PROVIDE CORRECT FILE NAME'.
    ENDIF.
    reward points to all helpful answers
    kiran.M

  • How To Create Gallery Wizard in Jdev 10.1.3.1?

    Folks,
    I'm working on an extension that will add a new file extension to JDeveloper. I would my extension to show up in the File/New Gallery. I know that this will involve code in the extension.xml and one or more Java classes.
    I've looked at the PHP extension and the extension.xml adds a PHPFileWizard to the File/New Gallery:
         <gallery>
            <item>
              <name>oracle.jdeveloper.addin.php.gallery.PHPFileWizard</name>
              <category>Web Tier</category>
              <folder>PHP</folder>
              <technologyKey>Web</technologyKey>
              <description>${PHP_FILE_DESC}</description>
            </item>
    ...Presumably PHPFileWizard implements one or more interfaces so that it is a 'legal' Gallery Wizard. Presumably my Java class needs to implement them as well. What are they? :)
    David Rolfe
    Orinda Software
    Dublin, Ireland
    Message was edited by:
    [email protected]
    (edited for clarity)

    The Extension SDK comes with a sample called class wizard that shows you how to implement a new wizard.
    There is a little error in one of the files there though.
    Here is the correct version of that file:
    package oracle.jdeveloper.extsamples.classgeneratorwizard;
    import java.awt.Dimension;
    import java.awt.Image;
    import java.io.File;
    import java.lang.reflect.Modifier;
    import java.net.URL;
    import javax.swing.JOptionPane;
    import oracle.bali.ewt.wizard.ImageWizardPage;
    import oracle.bali.ewt.wizard.Wizard;
    import oracle.bali.ewt.wizard.WizardDialog;
    import oracle.bali.ewt.wizard.WizardEvent;
    import oracle.bali.ewt.wizard.WizardListener;
    import oracle.ide.Context;
    import oracle.ide.editor.EditorManager;
    import oracle.ide.Ide;
    import oracle.ide.model.NodeFactory;
    import oracle.ide.model.Project;
    import oracle.ide.net.URLFactory;
    import oracle.ide.util.GraphicsUtils;
    import oracle.ide.wizard.WizardWelcomePage;
    import oracle.javatools.parser.java.v2.JavaConstants;
    import oracle.javatools.parser.java.v2.model.SourceBlock;
    import oracle.javatools.parser.java.v2.model.SourceClass;
    import oracle.javatools.parser.java.v2.model.SourceFile;
    import oracle.javatools.parser.java.v2.model.SourceMethod;
    import oracle.javatools.parser.java.v2.SourceFactory;
    import oracle.javatools.parser.java.v2.write.SourceTransaction;
    import oracle.jdeveloper.java.JavaManager;
    import oracle.jdeveloper.java.TransactionDescriptor;
    import oracle.jdeveloper.model.JavaProject;
    import oracle.jdeveloper.model.JavaSourceNode;
    import oracle.jdeveloper.model.PathsConfiguration;
    public class RealWizard extends Wizard implements WizardListener {
    // In this example, all images are the same. They could be different.
    private static final String WIZARD_LEFT_IMAGE_01 = "150x300_Generic.gif";
    private static final String WIZARD_LEFT_IMAGE_02 = "150x300_Generic.gif";
    private static final String WIZARD_LEFT_IMAGE_03 = "150x300_Generic.gif";
    private static final String WIZARD_LEFT_IMAGE_04 = "150x300_Generic.gif";
    private Context context;
    ImageWizardPage[] wizardPage;
    WizardWelcomePage wwp;
    ImageWizardPage iwpOne;
    ImageWizardPage iwpTwo;
    SummaryPage wsp;
    /** @snippet_reference {@start WizardContext.2} */
    private Model model;
    /** @snippet_reference {@end WizardContext.2} */
    public
    RealWizard(Context ctx) {
    this.context = ctx;
    this.model = new Model();
    this.setPreferredSize(new Dimension(166, 387));
    wwp = createWelcomePage();
    this.addPage(wwp.getWizardPage());
    /** @snippet_reference {@start WizardContext.3} */
    iwpOne = createWizardPageOne(model);
    this.addPage(iwpOne);
    PanelOne panelOne = (PanelOne)iwpOne.getInteractiveArea();
    iwpOne.addWizardValidateListener(panelOne);
    iwpTwo = createWizardPageTwo(model);
    this.addPage(iwpTwo);
    PanelTwo panelTwo = (PanelTwo)iwpTwo.getInteractiveArea();
    iwpTwo.addWizardValidateListener(panelTwo);
    wsp = createSummaryPage(model);
    /** @snippet_reference {@start WizardContext.3} */
    this.addPage(wsp);
    if (!wwp.isHidden())
    this.setSelectedPage(wwp.getWizardPage());
    else
    this.setSelectedPage(iwpOne);
    this.setMustFinish(true);
    wizardPage =
    new ImageWizardPage[] { wwp.getWizardPage(), iwpOne, iwpTwo,
    wsp };
    // Create wizard Dialog
    WizardDialog wDialog = createWizardDialog();
    wDialog.setTitle("Create a Java Class");
    this.addWizardListener(this);
    wDialog.runDialog();
    public void wizardApplyState(WizardEvent p0) {
    public void wizardCanceled(WizardEvent p0) {
    public void wizardFinished(WizardEvent p0) {
    try {
    // Get Current Project
    Project prj = Ide.getActiveProject();
    JavaSourceNode jsn = null;
    String greeting = this.model.getHelloWord();
    String greetee = this.model.getName2Greet();
    String className = "Hello" + greetee.replace(' ', '_');
    String packageName =
    JavaProject.getInstance(prj).getDefaultPackage();
    String srcPath =
    PathsConfiguration.getInstance(prj).getSourcePath().toString();
    String srcDir = "";
    if (srcPath.indexOf(File.pathSeparatorChar) > -1)
    srcDir =
    srcPath.substring(0,
    srcPath.indexOf(File.pathSeparatorChar));
    else
    srcDir = srcPath;
    URL dirURL =
    new File(srcDir + File.separator + packageName.replace('.',
    File.separatorChar)).toURL();
    URL classURL = URLFactory.newURL(dirURL, className + ".java");
    if (classURL == null) {
    JOptionPane.showMessageDialog(null,
    "Cannot create URL for " +
    className +
    ".java", "Ooops",
    JOptionPane.ERROR_MESSAGE);
    } else { // Let's go on
    jsn =
    (JavaSourceNode)NodeFactory.findOrCreate(JavaSourceNode.class, classURL);
    JavaManager javaMgr = JavaManager.getJavaManager(prj);
    SourceFile javaFile = javaMgr.getSourceFile(jsn.getURL());
    if (javaFile != null) {
    JOptionPane.showMessageDialog(null,
    "Cannot create URL for " +
    className + ".java" + "\n"
    +
    "Source Already Exists",
    "Error",
    JOptionPane.ERROR_MESSAGE);
    return;
    jsn =
    (JavaSourceNode)NodeFactory.findOrCreate(JavaSourceNode.class, classURL);
    prj.add(jsn, true);
    jsn.open();
    jsn.save();
    // Now the Node is created, let's create its content
    boolean success =
    createContent(jsn, prj, packageName, className, greeting,
    greetee);
    if (success) {
    jsn.save();
    EditorManager.getEditorManager().openDefaultEditorInFrame(jsn.getURL());
    } else {
    JOptionPane.showMessageDialog(null,
    "Cannot create node
    content",
    "Ooops",
    JOptionPane.ERROR_MESSAGE);
    } catch (Exception ex) {
    ex.printStackTrace();
    JOptionPane.showMessageDialog(null, ex.toString(), "Ooops",
    JOptionPane.ERROR_MESSAGE);
    public void wizardSelectionChanged(WizardEvent wEvent) {
    int pageNo = 0;
    try {
    pageNo = wEvent.getPage().getIndex();
    } catch (Exception ignore) {
    if (pageNo == 0) // to Welcome
    else if (pageNo == 1) {
    PanelOne p1 = (PanelOne)iwpOne.getInteractiveArea();
    p1.setDefaultValues();
    } else if (pageNo == 2) {
    PanelTwo p2 = (PanelTwo)iwpTwo.getInteractiveArea();
    p2.setDefaultValues();
    } else if (pageNo == 3) // to Summary and generation
    wsp.enterPage();
    private WizardWelcomePage createWelcomePage() {
    // This key is used to remember the "Show next time" check box!
    final String strShowAgainKey = "SAMPLE_EIGHT_REF";
    WizardWelcomePage wp = new WizardWelcomePage(strShowAgainKey);
    // Set the image
    java.awt.Image img =
    GraphicsUtils.loadFromResource(WIZARD_LEFT_IMAGE_01,
    this.getClass());
    // java.awt.Image img =
    GraphicsUtils.createImageIcon(GraphicsUtils.loadFromResource(WIZARD_LEFT_IMAGE
    _01, this.getClass())).getImage();
    if (img != null)
    wp.setImage(img);
    else
    System.out.println(WIZARD_LEFT_IMAGE_01 + " not found");
    // Set the Title
    final String welcomeTitle = "Creating a Java Class";
    wp.setTitle(welcomeTitle);
    // Set the Description Text for first page
    final String welcomeDesc =
    "This wizard will help you to create a Java Class." + "\n" +
    "This is a sample from the JDeveloper Extensions SDK
    demonstrating " +
    "how to integrate a wizard into the product." + "\n" +
    "Press Next to continue\n";
    wp.setDescription(welcomeDesc);
    // Return results
    return wp;
    private ImageWizardPage createWizardPageOne(Model m) {
    PanelOne panel = new PanelOne(m);
    final String title = "A dummy title";
    Image img =
    GraphicsUtils.createImageIcon(GraphicsUtils.loadFromResource(WIZARD_LEFT_IMAGE
    _02,
    this.getClass())).getImage();
    ImageWizardPage iwp = new ImageWizardPage(panel, img, title);
    return iwp;
    private ImageWizardPage createWizardPageTwo(Model m) {
    PanelTwo panel = new PanelTwo(m);
    final String title = "A dummy title";
    Image img =
    GraphicsUtils.createImageIcon(GraphicsUtils.loadFromResource(WIZARD_LEFT_IMAGE
    _03,
    this.getClass())).getImage();
    ImageWizardPage iwp = new ImageWizardPage(panel, img, title);
    return iwp;
    private SummaryPage createSummaryPage(Model m) {
    Image img =
    GraphicsUtils.createImageIcon(GraphicsUtils.loadFromResource(WIZARD_LEFT_IMAGE
    _04,
    this.getClass())).getImage();
    return new SummaryPage(m, img);
    private WizardDialog createWizardDialog() {
    WizardDialog wdlg = new WizardDialog(this, Ide.getMainWindow());
    return wdlg;
    private static final boolean createContent(JavaSourceNode node,
    Project prj, String
    packageName,
    String className,
    String greeting,
    String greetee) {
    boolean ret = true;
    JavaManager javaMgr = JavaManager.getJavaManager(prj);
    SourceFile javaFile = javaMgr.getSourceFile(node.getURL());
    final String QUOTE = "\"";
    String greet =
    QUOTE + greeting + QUOTE + " + \" \" + " + QUOTE + greetee +
    QUOTE + " + \"!\"";
    //logMessage("Step 1 - Initializing...");
    if (javaFile == null)
    return false;
    //logMessage("Step 2 - Getting Source File...");
    SourceTransaction st = javaFile.beginTransaction();
    try {
    SourceFactory factory = javaFile.getFactory();
    javaFile.setPackageName(packageName);
    //logMessage("Step 3 - Setting Package Name...");
    // Class Description
    SourceClass helloClass = factory.createClass(0, className);
    helloClass.addSelf(javaFile);
    helloClass.setModifiers(Modifier.PUBLIC);
    //logMessage("Step 4 - Setting Class Name...");
    // Create main method
    SourceBlock block = factory.createBlock();
    SourceMethod meth =
    factory.createMethod(factory.createType(JavaConstants.PRIMITIVE_VOID),
    "main",
    factory.createFormalParameterList(factory.createLocalVariable(factory.createTy
    pe("String",
    1),
    "args")),
    null,
    (SourceBlock)factory.createBlock("\n\n{\n\n\t" +
    "System.out.println(" +
    greet +
    ");" +
    "\n\t}"));
    meth.setModifiers(Modifier.PUBLIC | Modifier.STATIC);
    meth.addSelf(helloClass);
    //logMessage("Step 5 - Creating Main Method...");
    // Write the file
    javaMgr.commitTransaction(st,
    new TransactionDescriptor("Generate
    file"));
    //logMessage("Step 6 - Commiting Work...");
    } catch (Exception e) {
    st.abort();
    //logMessage(e.getMessage());
    ret = false;
    return ret;
    }

  • Financial Template Reports (Balance Sheet) - Auto appearance of running profit figure

    Dear Experts,
    I am working on SAP 9 Business One.
    I have prepared a Customized Balance Sheet through the Financial Report Templates for presentation purposes. But when I run the balance sheet using the Financial Template Report, the balance sheet doesn't match.
    I have found out the reason i.e. The running profit figure doesn't appear automatically.
    Someone please guide me on how to bring the profit figure automatically in the Balance Sheet, prepared through the Financial Report Templates, without running a period end closing as it shows in the balance sheet run with the 'Chart of Accounts'.
    Regards,
    Dharmik Kara

    hi Prasadbabu,
    Try it out this way. Create a new line called "Total Sales" below export sales and local sales and Subtotal" check it. In case, you cannot see the active accounts defined for export sales and local sales, then create dummy titles as parent levels and create the "Total Sales" at the same level as the export sales and local sales. In the subtotal formula, you can select the two sales accounts. After the total sales sub-total, you can go ahead with the other sales accounts.
    Bharath S

  • What command would  you use to open a directory (i work with mostly vista

    and xp...basically...I want to get a button to open an explorer file directory

    public class Exec {
         public static void main(String[] args) throws Exception {
        String[] commands =
           {"cmd", "/c", "start", "\"title\"", "\"c:/program files\""};
           Runtime.getRuntime().exec(commands);
    }You need to pass a dummy title to the start command especially if the target contains spaces.
    Bye.
    RG.

  • Trying To Connecting Tables

    Hi,
    I have a recipes section in the site I'm building with DW CS4. There are 7 categories from which a user can pick (Desserts, Drinks, etc).
    The first page of each category has a form on it for users to enter a new recipe. Once they've entered a new recipe, it's supposed to be sent to a new page (one for each recipe), and the title of it is shown above the form. Here's where the problem starts.
    I entered two dummy titles as a trial run into the Desserts Form, Apple and Blueberry. The titles are showing up above the form, but no matter which title I click on, I am taken to the page for Apple. And the thing is, when I click on Blueberry, the url address shows Blueberry as the recipe ID. Does anyone have any idea what might be happening, and/or what is missing from the code?
    There are two separate tables in my database, Recipes, and Categories, and each one has "Title" as the first field. The second table was created after I made the SQL connection in Dreamweaver.
    Thank you.
    This is the SQL Join that I have on both the main desserts page, and the one to which a recipe should appear on:
    $query = "SELECT title".
    "FROM recipes, categories".
    "WHERE recipes.cat_id = categories.cat_id";
    "AND category = desserts";
    Here's the code on the Main Desserts page that I'm guessing is where changes need to be made:
    Desserts
    Drinks
    Fowl
    Meat
    Pasta
    Seafood
    Vegetables
    <?php do { ?>
    <?php echo $row_GetRecipes['Title']; ?>
    <?php } while ($row_GetRecipes = mysqlfetchassoc($GetRecipes)); ?>
    ">Previous Showing<?php echo ($startRow_GetRecipes + 1) ?>...<?php echo min($startRow_GetRecipes + $maxRows_GetRecipes, $totalRows_GetRecipes) ?> out of <?php echo $totalRows_GetRecipes ?> ">Next

    Since you are using client to import table is it not required in local for tnsnames.ora?
    For server you have set that helps after hosting the rpd file, I hope you are not using online mode to import table if you are doing that I dont think that will work...
    Try to use your connection details something like below
    Call Interface: Default (OCI 10g/11g)
    Data source Name->localhost:1521/XE
    If helps mark or else let us know your basic test to connect to database like tnsping from command etc..

  • Removing DOM element effectively

    How can i efficiently remove child element from a Node? I have a scenario like this I have an xml doc given below
    <menudocument>
    <parentmenu name="menu">
    <item title="Home" url="http://localhost:8081/struts" permission="home.show"; />
    <menu name="create menus">
    <item title="Create Person" url="/struts/jsp/Personcreate.jsp"; permission="Hide" />
    <item title="Create Shop" url="/struts/jsp/ShopCreate.jsp"; permission="Hide" />
    <item title="Create Book" url="/struts/jsp/BookCreate.jsp"; permission="Hide" />
    </menu>
    <menu name="search">
    <item title="Search Book" url="/jsp/book!startSearch.action"; permission="book.search"; />
    <item title="Search Person" url="/jsp/person!startSearch.action"; permission="Hide" />
    </menu>
    <menu name="sample menu">
    <item title="Item Text1" url="itemurl.do"; permission="text1.item"; />
    <item title="Item Text1" url="itemurl.do"; permission="Hide" />
    </menu>
    <menu name="dummy menu">
    <item title="Dummy Title" rul="dummyurl" permission="title.dummy"; />
    </menu>
    </parentmenu>
    </menudocument> Here if the permission attribute of an element is 'Hide' I have to remove that element from the document
    I have a code snippet like below but i don't know why it is not removing all the elements with attribute value 'Hide'
    File menuFile = new File("XMLmenuFile.xml";);
    DocumentBuilder builder = Document().newDocumentBuilder();
    Document menuDocument = builder.parse(menuFile);
    NodeList nodes = menuDocument.getElementsByTagName("item");
    for (int i = 0; i < nodes.getLength(); i++) {
    Element itemTag = (Element) nodes.item(i);
    if (itemTag.getAttribute("permission")).equalsIgnoreCase("Hide")) {
    // remove the corresponding nodes from the new tree
    itemTag.getParentNode().removeChild(itemTag);
    } Any help will be greatly appreciated.
    Thanks,

    Is it only removing some of them? Then you are encountering the classic gotcha that when you remove an entry from a numbered list, you renumber all the entries after that one. But your code, which simply goes from 0 to n, doesn't account for that. If you traverse the entries from n to 0 then the problem doesn't arise.

  • Imovie Problems

    Hey, I am using a HDR-HC3 HDV 1080i video camera on imovie. Whenever I have the setting on my video camera (compressing it from HDV to DV) with the imovie format on PAL DV Widescreen I have no picture in imovie or it says the camera is not compatable, however If I turn off the conversion of HDV to DV its plays on the imovie screen, then when I import the file it's almost in slow mo (due to file size). Any ideas for help ?
    reply here or email, thank you!
    [email protected]

    ratmilk,
    Is your iLink CONV setting on or off?
    AlienCamel.com suggest
    1. DO NOT PLUG IN YOUR CAMERA
    2. On the menu in HC1 turn the VCR HDV/DV to DV
    3. On the menu turn the iLink conv HDV to DV ON
    4. Open iMovie and choose DV Widescreen project
    5. Connect camera to Mac, turn on and iMovie should recognize it as DV format
    6. Now go back to the menu and turn the VCR HDV/DV to AUTO
    7. Now the movie should import as DV
    http://discussions.apple.com/message.jspa?messageID=2770054#2770054
    PS. In the sama thread Lennart suggest
    Create a dummy title in your DV project and save. That way you have some "footage" already in the project and iMovie can no longer change the project from DV to HDV.

  • Would Appreciate Your Help - Tables Not Connecting/Pages Not Being Generated

    Hi,
    I have a recipes section in the site I'm building.
    There are 7 categories from which a user can click on.
    The first page of each category has a form on it for users to enter a new recipe. Once they've entered a new recipe, the title of it is shown above the form. Here's where the problem starts.
    First category is desserts, and I entered two dummy titles as a trial run, Apple and Blueberry. No matter which title I click on, I am taken to the page for Apple. And the thing is, when I click on Blueberry, the url address shows Blueberry as the recipe ID. Which indicates to me that it's recognizing it, but not going to the recipe. What am I missing? Could someone please advise as to how I can have the necessary pages created?
    There are two separate tables in my database, Recipes, and Categories. The second table was created after I made the SQL connection in Dreamweaver. Do I need to reestablish the connection, because of when the second table was created?
    Thank you.
    This is the SQL Join that I have on both the Main Desserts Page, and the one to which a recipe should appear on, Recipes Desserts:
    $query = "SELECT title".
    "FROM recipes, categories".
    "WHERE recipes.cat_id = categories.cat_id";
    "AND category = desserts";
    Here's the code on the Main Desserts page:
    <div id="background">
      <div id="navbar2">
        <ul>
    <li><a href="desserts.php">Desserts</a></li>
    <li><a href="drinks.php">Drinks</a></li>
    <li><a href="fowl.php">Fowl</a></li>
    <li><a href="meat.php">Meat</a></li>
    <li><a href="pasta.php">Pasta</a></li>
    <li><a href="seafood.php">Seafood</a></li>
    <li><a class="last" href="vegetables.php">Vegetables</a></li>
    </ul>
        <p>
      </div>
      <div id="items">
    <ol>
    <?php do { ?>
    <li><a href="recipesdesserts.php?recipeID=1<?php echo $row_GetRecipes['Title']; ?>"><strong><?php echo $row_GetRecipes['Title']; ?></strong></a></li>
    <?php } while ($row_GetRecipes = mysql_fetch_assoc($GetRecipes)); ?>
    </ol>
        <p><a href="<?php printf("%s?pageNum_GetRecipes=%d%s", $currentPage, max(0, $pageNum_GetRecipes - 1), $queryString_GetRecipes); ?>">Previous</a> Showing<?php echo ($startRow_GetRecipes + 1) ?>...<?php echo min($startRow_GetRecipes + $maxRows_GetRecipes, $totalRows_GetRecipes) ?> out of <?php echo $totalRows_GetRecipes ?> <a href="<?php printf("%s?pageNum_GetRecipes=%d%s", $currentPage, min($totalPages_GetRecipes, $pageNum_GetRecipes + 1), $queryString_GetRecipes); ?>">Next</a></p>
      </div>
      </div>

    I'll try to paint a better picture.
    I have two tables in the database.
    First table is Recipes. The fields in this one are: Title, Ingredients, Prep, Serves.
    Second table is Categories. The fields in this one are: Title, Desserts, Drinks, Fowl, Meat, Pasta, Seafood, Vegetables.
    User 1 enters the following into the form:
    Title: Apple Strudel
    Ingredients: Apples, Flour, Water
    Prep: Core and slice apples, etc.
    Serves: 6
    User 2 enters the following into the form:
    Title: Blueberry Pie
    Ingredients: Blueberries, Flour, Water
    Prep: Wash blueberries, etc.
    Serves: 6
    Both titles now appear on the Main Desserts page, which is what I want. When a user clicks on the title, "Apple Strudel," they are taken to the page with that recipe on it. When a user clicks on the title, "Blueberry Pie," the ending of the URL address is recipesdesserts.php?recipeID=1Blueberry, but the page that's generated shows the recipe for the Strudel.
    Does that help at all?
    Thank you.

  • Financial Report Template

    Hi Experts,
    I need to develop a report template for Financial Reports, I need to sort my accounts in a different way other than using the Chart of Accounts Template,I already tried creating a new template but I had some hick-ups, can any one please point me to any documentation/guide for developing report templates.
    Waiting to Hear from You.
    Kind Regards
    Edited by: Chike Nwogu on Dec 2, 2008 1:04 PM

    Hi
    To compile financial reports, the system needs a template that specifies the structure of the report. You must define these financial report templates in advance.
    For some countries SAP Business One delivers templates that you can use to create your own financial report templates. An alternative is to copy the structure of your chart of accounts and then make any necessary changes to it. You can use the financial report templates to compile balance sheets, profit and loss statements, and trial balance reports (totals and balances of G/L accounts and business partner accounts).
    Balance Sheet u2013 The system proposes the accounts in the Assets group as assets (active) accounts; the system proposes the accounts in the Liabilities group and the Capital and Reserves group as liability (passive) accounts. You can change these proposals on the highest levels of your financial report template. The system automatically displays the profit or loss for the period (Profit Period).
    Profit and Loss Statement u2013 The system proposes the accounts in all the other groups (Turnover, Cost of Sales, Operating Costs, Non-Operating Income and Expenditure, Taxation and Extraordinary Items) and offers the calculation of subtotals.
    Trial Balance u2013 The financial report template can contain the accounts from all groups. It displays the totals of all groups but does not offer any subtotal calculation.
    You can create comparison reports that compare the figures from a specific company or fiscal year with those of a different company or fiscal year.
    Choose Financials  Financial Reports  Financial and then Balance Sheet or Trial Balance or Profit and Loss Statement to generate these financial reports.
    Choose Financials  Financial Report Templates to define and maintain financial report templates.
    Editing a financial report template is similar, but not identical to, editing a chart of accounts.
    Every financial report template has exactly five levels.
    Levels one to four consist of only titles.
    The G/L accounts are all located on the fifth level.
    If you want the totals of the G/L accounts to be displayed on a higher level, you can make the higher titles invisible by selecting the Dummy Title indicator.
    You can hide G/L accounts if you donu2019t want them to be displayed.
    In a financial report template for balance sheets, you can let the system automatically transfer accounts to the other side of the balance sheet in case the account balance is negative. To do this, select the Transfer Accounts with Negative Sign indicator and specify the place where the transferred account should be.
    In a financial report template for profit and loss statements, the system can insert a subtotal on every level:
    Level 1 (level of account groups): Select Automatic Summary to let the system use predefined formulas for the gross profit, operating profit, profit after financing expenses, and profit period.
    All levels: You can define your own formulas. Select Totals Formula and choose Formula to enter a formula based on the titles of the same level as the subtotal.
    Regards
    Rashid

  • Replacing Element with text using Java iwth XPath

    Hi
    I have to relpace elements which are with name <Link>,with
    string <?abc id='10' city='xxx' ?>
    <root>
    <title>Dummy title</title>
    <content type='html'>
    <Link id='100,101'/> Dummy <a href='www.google.com'>content</a> that the <a href='www.yahoo.com'>cross</a> linking tool will manipulate
    </content>
    <content type='html'>
    <Link id='200,201'/> Dummy <a href='www.google.com'>content</a> that the <a href='www.yahoo.com'>cross</a> linking tool will manipulate
    </content>
    <content type='html'>
    <Link id='300,301'/> Dummy <a href='www.google.com'>content</a> that the <a href='www.yahoo.com'>cross</a> linking tool will manipulate
    </content>
    <removed>500</removed_ids>
    </root>expected out put is file is
    code]<root>
    <title>Dummy title</title>
    <content type='html'>
    <?abc id='100,101' city='xxx' ?>Dummy content that the cross linking tool will manipulate
    </content>
    <content type='html'>
    <?abc id='200,201' city='xxx' ?>Dummy content that the cross linking tool will manipulate
    </content>
    <content type='html'>
    <?abc id='300,310' city='xxx' ?> Dummy content that the cross linking tool will manipulate
    </content>
    <removed>500</removed_ids>
    </root>
    java code is
    DocumentBuilder builder = DocumentBuilderFactory.newInstance().newDocumentBuilder();
        Document document = builder.parse(new File("C:\\LinkProcess.xml"));
        XPath xpath = XPathFactory.newInstance().newXPath();
        String expression = "//Link";
        NodeList  nodelist = (NodeList) xpath.evaluate(expression, document, XPathConstants.NODESET);
        for(int i=0;i<nodelist.getLength();i++){
        Element element = (Element)nodelist.item(i);
        String id = element.getAttribute("id");
        System.out.println("id = "+id);
        Text text = document.createTextNode("<?dctm id ='100'?>");
        document.insertBefore(text,element);
        System.out.println("remove is success");
        }document.insertBefore(text,element); statement throwing exception as
    org.w3c.dom.DOMException: HIERARCHY_REQUEST_ERR: An attempt was made to insert a node where it is not permitted.
    and i would like to remove element named <removed>
    can you help in this
    Thanks & Regards
    vittal

    1. This element makes your XML document malformed:<removed>500</removed_ids>The name of the start tag and the closing tag must always be identical.
    http://www.w3.org/TR/REC-xml/#sec-starttags
    2. The type of the nodes with which you would like to replace your <Link> elements is called "ProcessingInstruction". Processing instructions are to be handled somewhat differently from elements.
    3. The string "><?dctm id ='100'?>" is misspelled. Additionally, it is meant to be a processing instruction so it should not be created as a text node.
    4. You use a node list to replace elements by means of a loop. A loop is only useful when there is a system to the data to be processed, which is not the case with your processing instructions:<?abc id='100,101' city='xxx'?>
    <?abc id='200,201' city='xxx'?>
    <?abc id='300,310' city='xxx'?>From the fact that you use a loop, I presume that the third node is meant to be <?abc id='300,301' city='xxx' ?>. If so, you can use this code:DocumentBuilder builder = DocumentBuilderFactory.newInstance().newDocumentBuilder();
    Document document = builder.parse(new File("C:\\LinkProcess.xml"));
    XPath xpath = XPathFactory.newInstance().newXPath();
    String expression = "//Link";
    NodeList  nodelist = (NodeList) xpath.evaluate(expression, document, XPathConstants.NODESET);
    float n;
    String piData;
    ProcessingInstruction pi;
    for(int i=0;i<nodelist.getLength();i++){
      Element element = (Element)nodelist.item(i);
      n = (i+1)*100+((i+1)*100+1)/1000F;
      piData = "id='" + n + "' city='xxx'";
      pi = document.createProcessingInstruction("abc", piData);
      element.getParentNode().replaceChild(pi, element);
      System.out.println("Element <Link...> has been replaced with <?abc " + piData + "?>");
    }This code is not ideal, but I hope is easy to understand and you will be able to change it to suit your needs.
    5. To remove an element use the removeChild() method of the Node interface. If your XML document contains "ignorable" white spaces, it's best to use an XPath expression again ("root/removed") to set reference to the node to be removed rather than locate it by position (e.g. using the getLastChild() method).

  • Saving favorite titles - dummy project best?

    I'm just beginning to learn FCP X.  I used to be fairly proficient in FCP a few years ago and just getting back into editing now.
    I am looking for the best way to save a favorite title with color and other formatting.
    Stumbled on the fact that I can save a duplicate project in the project library with all kinds of favorite stuff including titles and then copy from that master dummy project and paste stuff into a current project.
    Is there a simpler way of doing this?

    Couple of ways, simplest is in the Text inspector, click on where it sasys Normal and select a save option.

  • Can't add more than one title over single clip

    This is the first time I'm using a clip that is unedited apart from a title card over black at the beginning that dissolves into the clip and a dissolve to a still photo at the end of the clip.  So far I have only been able to add three titles: the first over black, the second over the actual clip, and the third over the still photo.
    The clip lasts around a minute so I want to add titles as it progresses.  For example, the first title can last for 5 seconds, then a gap of 10 secs. and then another title for 5 seconds, etc.  Every time I try to drag the title
    Every time I try to drag a title into the project, it doesn't "take."  Does iMovie not allow a string of titles if there are no edits within the actual clip?
    Thanx.

    This applies to iMovie 08:
    1) It appears that when you drag a photo or a title to a long clip, then by default, it thinks you want a long photo (or title). It seems like it wants to make the photo 25% or more of the length of the clip. This is why it is hard to drag multiple photos to a clip. The last photo you drag is trying to take up 25% plus of the clip, and there may not be room.
    I found a good workaround. I added a dummy clip that was 4 seconds long to the end of the project. (This clip to be deleted before sharing the project). When I drag a new photo to the project, I first drag it to the dummy clip. Now the photo has a duration of exactly four seconds, and I can drag it to the place I really want it. It fits now, because it is only four seconds.
    2) I confirmed that when you put over 4-5 photos into a single clip, they will start behaving erratically. One will not show up, and another will show up twice.
    The solution is to split the long clip into multiple clips. I had a long clip. I split the long clip into 30 second chunks. To do this, I imported the entire clip several times. Then, in the first instance I selected from frames 00:00 to 30:00. In the second clip I selected frames 30:01 to 1:00:00. Then 1:00:01 to 1:30:00. etc. This way, I did not lose any footage, but I had multiple virtual clips, where before there was only one. Now I was able to add multiple photos to each of these shorter clips with no trouble. And I only needed four photos per clip. It worked great. 

  • Drill-down and how to change to the correct value in the dashboard title

    Good Morning,
    I have a problem on the presentational side, which some of you might have seen as well.
    My dashboard page looks like this:
    Dummy Prompt 1: YearFrom
    Dummy Prompt 2: YearTo
    Prompt 3: Item
    All three prompts have a presentation variable to show their respective value in the title of the dashboard page.
    Below the prompts is the report, which is filtered by the three prompts and contains a column "year" with the option to drill-down.
    When I drill-down on a "year" value, a column "month" appears and shows the values of the year by month.
    Problem : After the drill-down the title still displays the old "YearFrom" "YearTo" values and not the year I drilled-down on
    Question: How to I change the title to the correct year?
    Optional: In the drilled-down report I would like to hide the column "year".
    Every idea is appreciated
    Turalf

    hi, with JSF 2 you got the ajax tag, just tried it and it works fine :)
    <h:inputText id="myinput" value="#{back.name}">
        <f:ajax execute="@this" event="keyup" render="outtext"/>
    </h:inputText>
    <h:outputText id="outtext" value="#{back.name}"/>or before JSF 2
    <h:outputScript name="jsf.js" library="javax.faces" target="head"/>
    <h:inputText id="myinput" value="#{back.name}" onkeyup="jsf.ajax.request(this, event, {render: 'outtext'}); return false;"/>
    <h:outputText id="outtext" value="#{back.name}"/>The name property is a simple String in the bean.
    Hope this helps
    Edited by: hereps on Aug 21, 2010 7:18 AM

Maybe you are looking for