Losing portal context when URL is submitted from flash/flex portlet

Hi, I am losing portal context when URL is submitted from action scripting in Flash/Flex portlet. I have selected the remote webservice portlet to use inline refresh. The jsp page is opening up in complete browser window instead of showing in portlet section.
below is the code snippet i am using.
<mm:mxml>
     <mx:Application xmlns:mx="http://www.adobe.com/2006/mxml" width="400" height="200">
     <mx:Script><![CDATA[
     public function submitToBrowser():void {
     var url:String = "formsubmit.jsp";
     var u:URLRequest = new URLRequest();
     var variables:URLVariables = new URLVariables();     
     variables.name = fName.text;     
     u.data = variables;
     u.url = url;
     u.method = "POST";
     navigateToURL(u,"_self");
     ]]></mx:Script>
          <mx:Form id="myForm" defaultButton="{mySubmitButton}">
          <mx:FormItem label="User Name">
          <mx:TextInput id="fName" name="fName"/>
          </mx:FormItem>
          <mx:FormItem label="Password">
          <mx:TextInput id="password" displayAsPassword="true"/>
          </mx:FormItem>
          <mx:FormItem>
          <mx:Button label="Submit" id="mySubmitButton"
          click="submitToBrowser();"/>
          </mx:FormItem>
          </mx:Form>
     </mx:Application>
</mm:mxml>

inline refresh modifies javascript, not flex. Maybe try an iframe?

Similar Messages

  • Quality Loss when transferring AVCHD File from Flash Card to iMovie

    I have a Canon HF100 and the HD video looks great when I play directly from the video camera to the television. However, there is a loss in quality when I import to iMovie 08 and play the HD video on quicktime. How can I prevent the loss in quality so that playback on my iMac equals playback directly from the video camera to the TV?

    First, be sure to import at "Full" 1920x1080.
    Second, when you "Share", pick "Share"/Using Quicktime. This will let you customize settings. In Quicktime Settings, pick AIC with an unlimited data rate. For a smaller file, you can also try h.264 with an very high data rate.
    You might look at this old post for some details:
    http://discussions.apple.com/thread.jspa?messageID=7022027&#7022027

  • Browser portlet losing navigation context when switching pages

    Hi,
    I have a desktop with 2 pages, each holding a URL/Browser Portlet. Each time, I switch pages (running locally), the entire porlet reloads the url content. The portal doesn't remember where I browsed when I switch pages.
    For example, if I browse from a.jsp to b.jsp in page1/portlet1 then switch to page 2 and switch back again to page 1, page a.jsp loads into portlet1 as though i was browsing there for the first time. Is there a setting that I'm missing? Or a backing file, or is it because i'm only using a file based verion for my initial development? Or, does switching pages always force a reload?

    inline refresh modifies javascript, not flex. Maybe try an iframe?

  • How to debug a program when it is SUBMITed from another program

    Hi All,
    Now one more query.  While SUBMITing a Z program1 from Z program2, I want to debug the Z program1.  Even when I keep a break point in Z program1, it is not triggering there.  Any help would be appreciated.
    Regards,
    Balaji

    Hi all,
    Please find the full code.  I want to debug the sub routine PERFORM send_mail.
    1.  The main program.
    REPORT  Z_ITSLIP_MAIL                           .
    TABLES : pa0000, pa0001.                         .
    SELECT-OPTIONS : pernr FOR pa0000-pernr NO INTERVALS.
    DATA : count LIKE tbtcjob-jobcount.
    DATA : released LIKE btch0000-char1.
    DATA:
            l_valid,
            ls_params LIKE pri_params,
            l_jobcount LIKE tbtcjob-jobcount.
    PARAMETERS: p_job TYPE tbtcjob-jobname NO-DISPLAY.
    PARAMETERS: p_prog(30) TYPE c NO-DISPLAY..
    PARAMETERS: p_sdat LIKE sy-datum DEFAULT sy-datum .
    PARAMETERS: p_stim TYPE sy-uzeit DEFAULT sy-uzeit .
    PARAMETERS : payroll LIKE qppnp-xabkr OBLIGATORY.
    *PARAMETERS : period LIKE qppnp-pabrp OBLIGATORY.
    *PARAMETERS : year LIKE qppnp-pabrj OBLIGATORY.
    select-options : Period for sy-datum.
    DATA : BEGIN OF it_p0001 OCCURS 0,
           pernr LIKE pa0001-pernr,
           END OF it_p0001.
    p_sdat = p_sdat + 1.
    *Get Print Parameters
    CALL FUNCTION 'GET_PRINT_PARAMETERS'
      EXPORTING
        no_dialog      = 'X'
      IMPORTING
        valid          = l_valid
        out_parameters = ls_params.
    IF pernr[] IS INITIAL.
      SELECT pernr
       INTO TABLE it_p0001
       FROM pa0001.
      SORT it_p0001 BY pernr.
      DELETE ADJACENT DUPLICATES FROM it_p0001.
      LOOP AT it_p0001.
        MOVE it_p0001-pernr TO pernr-low.
        APPEND pernr.
        CLEAR pernr.
      ENDLOOP.
    ENDIF.
    LOOP AT pernr.
      CLEAR p_job.
      p_stim = p_stim + 120.
      CONCATENATE'ITSlip' pernr-low p_job sy-datum INTO p_job SEPARATED BY
    space.
      CALL FUNCTION 'JOB_OPEN'
        EXPORTING
          jobname  = p_job
        IMPORTING
          jobcount = l_jobcount.
      SUBMIT ZPR022_INNCOMETAX_REPORT_copy
        WITH PNPTIMR6 = 'X'
        WITH PNPBEGDA = period-low
        WITH PNPENDDA = period-high
        WITH PNPPERNR-LOW = PERNR-LOW
        WITH PNPABKRS-LOW = 'IN'
           VIA JOB     p_job
            NUMBER  l_jobcount
           TO SAP-SPOOL WITHOUT SPOOL DYNPRO
               SPOOL PARAMETERS ls_params
               WITH immediately = space
                  AND RETURN.
      CALL FUNCTION 'JOB_CLOSE'
        EXPORTING
          jobcount  = l_jobcount
          jobname   = p_job
          strtimmed = 'X'
         PRDMINS = 2.
          sdlstrtdt = p_sdat
          sdlstrttm = p_stim.
    ENDLOOP.
    2.  The called program.
    REPORT  zpr022_inncometax_report_copy NO STANDARD PAGE HEADING LINE-SIZE
    89.
    TABLES : pernr, t512e, t512t,pa0105.
          Infotypes
    INFOTYPES : 0000, 0001, 0008, 0580.
          Types                    Begin with TY_
    DATA : BEGIN OF wa_lgart,
           lgart TYPE t512e-lgart,
           windo TYPE t512e-windo,
           slart TYPE t512e-slart,
           lgtxt TYPE t512t-lgtxt,
           kztxt TYPE t512t-kztxt,
           END OF wa_lgart.
    DATA : BEGIN OF wa_income,
           particular(24) TYPE c,
           lgart    TYPE lgart,
           cumm(13) TYPE p DECIMALS 2,
           proj(13) TYPE p DECIMALS 2,
           exem(13) TYPE p DECIMALS 2,
           annu(13) TYPE p DECIMALS 2,
           END OF wa_income.
    DATA : BEGIN OF wa_income1,
           particular(24) TYPE c,
           lgart    TYPE lgart,
           cumm(13) TYPE c,
           proj(13) TYPE c,
           exem(13) TYPE c,
           annu(13) TYPE c,
           END OF wa_income1.
    DATA : BEGIN OF wa_invest,
           particular(40) TYPE c,
           betrg(13) TYPE p DECIMALS 2,
           END OF wa_invest.
    DATA : BEGIN OF wa_invest1,
           particular(40) TYPE c,
           betrg(13) TYPE c,
           END OF wa_invest1.
    DATA : BEGIN OF wa_deduct,
           particular(40) TYPE c,
           sbs TYPE pin_sbsec,
           betrg(13) TYPE p DECIMALS 2,
           END OF wa_deduct.
    DATA : BEGIN OF wa_deduct1,
           particular(40) TYPE c,
           sbs TYPE c,
           betrg(13) TYPE c,
           END OF wa_deduct1.
    DATA: BEGIN OF cocd OCCURS 10.
            INCLUDE STRUCTURE pincc.
    DATA: END OF cocd.
    DATA: BEGIN OF f16 OCCURS 10.
            INCLUDE STRUCTURE pin16.
    DATA: END OF f16.
          Constants                Begin with C_
          Data                     Begin with W_
    DATA : w_clstrid TYPE t500l-relid,         "Cluster ID
           w_molga   TYPE t500p-molga,         "Country Code
           w_period(6) TYPE c,
           w_var(2) TYPE n,
           w_pr_from1 TYPE t569v-pabrj,        "year
           w_pr_to1 TYPE t569v-pabrp,          "period
           w_fpper-low1 TYPE pc261-fpper,
           w_year(4) TYPE n,
           w_ltaexe(13) TYPE p DECIMALS 2,
           w_cumm(13) TYPE p DECIMALS 2,
           w_lgtxt(20) TYPE c,
           w_lgart     TYPE lgart,
           w_amount(13) TYPE p DECIMALS 2,
           w_wage(4)   TYPE c,
           w_flag(1) TYPE c,
           w_total(13) TYPE p DECIMALS 2,
           w_start TYPE sy-datum,
           w_end   TYPE sy-datum,
           w_date  TYPE sy-datum,
           w_index(2) TYPE n VALUE 00,
           w_investnm(40),
           w_investnm1(40),
           w_ded0585(13) TYPE p DECIMALS 2,
           w_itext TYPE t7ini3-itext,
           w_dtext TYPE t7ini8-sbdds,
           w_inprvemp(13) TYPE p DECIMALS 2,
           w_nettaxin(13) TYPE p DECIMALS 2,
           w_ptaxprvemp(13) TYPE p DECIMALS 2,
           w_ptaxcremp(13) TYPE p DECIMALS 2,
           w_othtaxin(13) TYPE p DECIMALS 2,
           w_gssin(13) TYPE p DECIMALS 2,
           w_dedtot(13) TYPE p DECIMALS 2,
           w_invtot(13) TYPE p DECIMALS 2,
           w_inchrtax(13) TYPE p DECIMALS 2,
           w_nettaxpay(13) TYPE p DECIMALS 2,
           w_surchr(13) TYPE p DECIMALS 2,
           w_cess(13) TYPE p DECIMALS 2,
           w_totintax(13) TYPE p DECIMALS 2,
           w_tdsothin(13) TYPE p DECIMALS 2,
           w_cessrec(13) TYPE p DECIMALS 2,
           w_prvemp(13) TYPE p DECIMALS 2,
           w_tottaxpay(13) TYPE p DECIMALS 2,
           w_var1(13) TYPE p DECIMALS 2,
           w_var2(13) TYPE p DECIMALS 2,
           w_balit(13) TYPE p DECIMALS 2,
           w_avgmon(13) TYPE p DECIMALS 2,
           w_remmon(2) TYPE n,
           w_profund(13) TYPE p DECIMALS 2,
           w_pf(13) TYPE p DECIMALS 2,
           w_dept(25) TYPE c,
           w_desig(25) TYPE c,
           w_join TYPE sy-datum,
           w_annperk(13) TYPE p DECIMALS 2,
           w_percent TYPE pin_txexm,
           w_limit TYPE pin_sdvlt,
           w_st0008  TYPE sy-datum,
           w_en0008  TYPE sy-datum.
    DATA: w_cmonth(2) TYPE n,
          w_cyear(4)  TYPE n,
          w_cdate LIKE sy-datum,
          w_ldate LIKE sy-datum.
          Internal tables          Begin with IT_
    DATA : it_0001 TYPE STANDARD TABLE OF pa0001,
           it_data TYPE STANDARD TABLE OF pa0001,
           it_0000 TYPE STANDARD TABLE OF pa0000,
           it_lgart LIKE STANDARD TABLE OF wa_lgart,
           it_pc261 TYPE STANDARD TABLE OF pc261,
           it_payrt_result TYPE payin_result,
           it_income LIKE STANDARD TABLE OF wa_income,
           it_income1 LIKE STANDARD TABLE OF wa_income1,
           it_wage   LIKE it_income,
           it_invest LIKE STANDARD TABLE OF wa_invest,
           it_invest1 LIKE STANDARD TABLE OF wa_invest1,
           it_deduct LIKE STANDARD TABLE OF wa_deduct,
           it_deduct1 LIKE STANDARD TABLE OF wa_deduct1,
           it_0586 TYPE STANDARD TABLE OF pa0586,
           it_0580 TYPE STANDARD TABLE OF pa0580,
           it_0584 TYPE STANDARD TABLE OF pa0584,
           it_0585 TYPE STANDARD TABLE OF pa0585,
           it_t7ini3 TYPE STANDARD TABLE OF t7ini3,
           it_info TYPE STANDARD TABLE OF zpt011_fep_pay,
           it_0008 TYPE STANDARD TABLE OF pa0008,
           it_rt TYPE STANDARD TABLE OF pbwla WITH HEADER LINE.
    DATA    : p_email1 LIKE somlreci1-receiver,
                                     DEFAULT '[email protected]'
               p_sender LIKE somlreci1-receiver.
                                         DEFAULT '[email protected]',
    *DATA DECLARATION
    DATA: gd_recsize TYPE i.
    data: date like sy-datum.
    Spool IDs
    TYPES: BEGIN OF t_tbtcp.
            INCLUDE STRUCTURE tbtcp.
    TYPES: END OF t_tbtcp.
    DATA: it_tbtcp TYPE STANDARD TABLE OF t_tbtcp INITIAL SIZE 0,
          wa_tbtcp TYPE t_tbtcp.
    Job Runtime Parameters
    DATA: gd_eventid LIKE tbtcm-eventid,
          gd_eventparm LIKE tbtcm-eventparm,
          gd_external_program_active LIKE tbtcm-xpgactive,
          gd_jobcount LIKE tbtcm-jobcount,
          gd_jobname LIKE tbtcm-jobname,
          gd_stepcount LIKE tbtcm-stepcount,
          gd_error    TYPE sy-subrc,
          gd_reciever TYPE sy-subrc.
    DATA:  w_recsize TYPE i.
    DATA: gd_subject   LIKE sodocchgi1-obj_descr,
          it_mess_bod LIKE solisti1 OCCURS 0 WITH HEADER LINE,
          it_mess_att LIKE solisti1 OCCURS 0 WITH HEADER LINE,
          gd_sender_type     LIKE soextreci1-adr_typ,
          gd_attachment_desc TYPE so_obj_nam,
          gd_attachment_name TYPE so_obj_des.
    Spool to PDF conversions
    DATA: gd_spool_nr LIKE tsp01-rqident,
          gd_destination LIKE rlgrap-filename,
          gd_bytecount LIKE tst01-dsize,
          gd_buffer TYPE string.
    Binary store for PDF
    DATA: BEGIN OF it_pdf_output OCCURS 0.
            INCLUDE STRUCTURE tline.
    DATA: END OF it_pdf_output.
    CONSTANTS: c_dev LIKE  sy-sysid VALUE 'DEV',
               c_no(1)     TYPE c   VALUE ' ',
               c_device(4) TYPE c   VALUE 'LOCL'.
          Work Area                Begin with WA_
    DATA : wa_0001 LIKE LINE OF it_0001,
           wa_data LIKE LINE OF it_data,
           wa_0000 LIKE LINE OF it_0000,
           wa_pc261 LIKE LINE OF it_pc261,
           wa_payrt_result TYPE LINE OF hrpay99_rt,
           wa_paycrt_result TYPE LINE OF hrpay99_crt,
           wa_0586 LIKE LINE OF it_0586,
           wa_0580 LIKE LINE OF it_0580,
           wa_0584 LIKE LINE OF it_0584,
           wa_0585 LIKE LINE OF it_0585,
           wa_t7ini3 LIKE LINE OF it_t7ini3,
           wa_in LIKE LINE OF it_income,
           wa_info LIKE LINE OF it_info,
           wa_0008 LIKE LINE OF it_0008,
           wa_wage LIKE wa_income,
           wa_rt TYPE pbwla.
          Field Symbols            Begin with FS_
    FIELD-SYMBOLS: <itc> TYPE ANY,
                   <ain> TYPE ANY,
                   <amt> TYPE ANY,
                   <sbdnn> TYPE ANY,
                   <tot> TYPE ANY.
          Select Options          Begin with SO_
    *SELECT-OPTIONS :
          Parameters              Begin with PR_
    *PARAMETERS     :
          Initialisation
    INITIALIZATION.
    date = sy-datum.
          Selection-Screen
          S T A R T   O F   S E L E C T I O N
    START-OF-SELECTION.
    GET pernr.
      SELECT * FROM pa0001 INTO CORRESPONDING FIELDS OF TABLE it_0001
                    WHERE pernr IN pnppernr
                    AND   abkrs IN pnpabkrs
                    AND   bukrs IN pnpbukrs.
      DELETE ADJACENT DUPLICATES FROM it_0001 COMPARING pernr.
      SELECT * FROM pa0000 INTO CORRESPONDING FIELDS OF TABLE it_0000
                    WHERE pernr IN pnppernr.
      SELECT   t512e~lgart
               t512e~slart
               t512t~lgtxt
               t512t~kztxt
               INTO CORRESPONDING FIELDS OF TABLE it_lgart
               FROM t512e INNER JOIN t512t ON
                                     t512elgart = t512tlgart AND
                                     t512emolga = t512tmolga
               WHERE t512e~forml = 'ZPY2' AND
                     t512t~sprsl = sy-langu AND
                     t512e~molga = '40' AND
                     t512e~windo EQ 'W1' .
      LOOP AT it_lgart INTO wa_lgart WHERE lgart+0(1) EQ '/'.
        DELETE it_lgart.
      ENDLOOP.
      SORT it_lgart BY lgart.
    **---Here we are getting the start and the End of the financial year...
      CLEAR : w_date, w_start, w_end, w_year.
      w_date = sy-datum.
    **---Here we get the start date of the year.....
      IF w_date+4(2) BETWEEN '01' AND '04'.
        w_year = w_date+0(4).
        w_year = w_year - 1.
        CONCATENATE w_year '04' '01' INTO w_start.
      ELSE.
        CONCATENATE w_date+0(4) '04' '01' INTO w_start.
      ENDIF.
    **---Here we get the end date of the year......
      CLEAR : w_year.
      IF w_date+4(2) BETWEEN '01' AND '04'.
        CONCATENATE w_date+0(4) '03' '31' INTO w_end.
      ELSE.
        w_year = w_date+0(4).
        w_year = w_year + 1.
        CONCATENATE w_year '03' '31' INTO w_end.
      ENDIF.
      CLEAR : w_year.
          E N D       O F   S E L E C T I O N
    END-OF-SELECTION.
    **---perform for getting the Income tax Calculation part....
      PERFORM f000_get_income.
      PERFORM send_mail.
          User Command Processing
    *AT USER-COMMAND.
          Top Of Page
    TOP-OF-PAGE.
      WRITE : / 'Mindtree Consulting Pvt Ltd',
              / 'No.42, 27th Cross',
              / '2nd Stage, Banashankari',
              / 'Bangalore - 560070'.
    *&      Form  f000_get_income
          text
         -->P_IT_0001  text
         -->P_IT_LGART  text
    FORM f000_get_income.
      LOOP AT it_0001 INTO wa_0001.
        CLEAR : wa_invest, wa_deduct, wa_income.
        REFRESH : it_invest, it_deduct, it_income.
        CONCATENATE pnppabrj pnppabrp INTO w_period.
    **---Here we are getting the Earnings in India from RT Table...
    **---Getting the relid for each employee....
        CALL FUNCTION 'PYXX_GET_RELID_FROM_PERNR'
          EXPORTING
            employee                    = wa_0001-pernr
          IMPORTING
            relid                       = w_clstrid
            molga                       = w_molga
          EXCEPTIONS
            error_reading_infotype_0001 = 1
            error_reading_molga         = 2
            error_reading_relid         = 3
            OTHERS                      = 4.
        IF sy-subrc <> 0.
         MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
         WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
        ENDIF.
    **---Reading the rgdir of cluster 'CU' for each of the employees...
        CALL FUNCTION 'CU_READ_RGDIR'
          EXPORTING
            persnr          = wa_0001-pernr
          TABLES
            in_rgdir        = it_pc261
          EXCEPTIONS
            no_record_found = 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.
        CLEAR : w_lgtxt, w_cumm, w_ltaexe, w_flag.
        LOOP AT it_pc261 INTO wa_pc261 WHERE fpper = w_period
                                       AND   srtza  = 'A'.
    **---Importing the Payroll cluster results for each employee from RT....
          CALL FUNCTION 'PYXX_READ_PAYROLL_RESULT'
            EXPORTING
              clusterid                    = w_clstrid
              employeenumber               = wa_0001-pernr
              sequencenumber               = wa_pc261-seqnr
            CHANGING
              payroll_result               = it_payrt_result
            EXCEPTIONS
              illegal_isocode_or_clusterid = 1
              error_generating_import      = 2
              import_mismatch_error        = 3
              subpool_dir_full             = 4
              no_read_authority            = 5
              no_record_found              = 6
              versions_do_not_match        = 7
              error_reading_archive        = 8
              error_reading_relid          = 9
              OTHERS                       = 10.
          IF sy-subrc <> 0.
           MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
           WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
          ENDIF.
    **---Processing....
          LOOP AT it_lgart INTO wa_lgart.
            CLEAR : wa_income.
            IF wa_lgart-lgart NE '5004' AND
               wa_lgart-lgart NE '5007' AND
               wa_lgart-lgart NE '5008' AND
               wa_lgart-lgart NE '5011' AND
               wa_lgart-lgart NE '5012' AND
               wa_lgart-lgart NE '5014' AND
               wa_lgart-lgart NE '5017' AND
               wa_lgart-lgart NE '5018' AND
               wa_lgart-lgart NE '5027' AND
               wa_lgart-lgart NE '5029' AND
               wa_lgart-lgart NE '5031' AND
               wa_lgart-lgart NE '5039' AND
               wa_lgart-lgart NE '5060' AND
               wa_lgart-lgart NE '7004' AND
               wa_lgart-lgart NE '7007' AND
               wa_lgart-lgart NE '7008' AND
               wa_lgart-lgart NE '7011' AND
               wa_lgart-lgart NE '7012' AND
               wa_lgart-lgart NE '7014' AND
               wa_lgart-lgart NE '7017' AND
               wa_lgart-lgart NE '7018' AND
               wa_lgart-lgart NE '7027' AND
               wa_lgart-lgart NE '7029' AND
               wa_lgart-lgart NE '7031' AND
               wa_lgart-lgart NE '7039' AND
               wa_lgart-lgart NE '7060'.
              LOOP AT it_payrt_result-inter-crt INTO wa_paycrt_result
                      WHERE cumty = 'Y' AND lgart EQ wa_lgart-lgart.
                IF wa_lgart-lgart+0(1) = '7'.
                  LOOP AT it_payrt_result-inter-crt INTO wa_paycrt_result
                           WHERE cumty = 'M' AND lgart EQ wa_lgart-lgart.
                    READ TABLE it_payrt_result-inter-rt INTO
                               wa_payrt_result WITH
                               KEY lgart = wa_lgart-lgart.
                    IF sy-subrc = 0.
                      wa_income-particular = wa_lgart-lgtxt.
                      wa_income-lgart      = wa_paycrt_result-lgart.
                      wa_income-cumm       = wa_paycrt_result-betrg.
                    ENDIF.
                  ENDLOOP.
                ELSE.
                  wa_income-particular = wa_lgart-lgtxt.
                  wa_income-lgart      = wa_paycrt_result-lgart.
                  wa_income-cumm       = wa_paycrt_result-betrg.
                ENDIF.
              ENDLOOP.
              REFRESH : it_0008.
              CLEAR : wa_0008.
              PERFORM f010_get_date USING pnppabrp pnppabrj.
              CALL FUNCTION 'SG_PS_GET_LAST_DAY_OF_MONTH'
                EXPORTING
                  day_in            = w_cdate
                IMPORTING
                  last_day_of_month = w_ldate
                EXCEPTIONS
                  day_in_not_valid  = 1
                  OTHERS            = 2.
              SELECT * FROM pa0008 INTO CORRESPONDING FIELDS OF TABLE
                       it_0008 WHERE pernr = wa_0001-pernr
                               AND   begda <= w_cdate
                               AND   endda >= w_ldate.
              IF it_0008 IS INITIAL.
                SELECT * FROM pa0008 INTO CORRESPONDING FIELDS OF TABLE
                         it_0008 WHERE pernr = wa_0001-pernr
                                 AND   begda BETWEEN w_cdate AND w_ldate.
                IF it_0008 IS INITIAL.
                  SELECT * FROM pa0008 INTO CORRESPONDING FIELDS OF TABLE
                        it_0008 WHERE pernr = wa_0001-pernr
                                AND   begda = w_cdate.
                ENDIF.
              ENDIF.
              CLEAR : w_st0008, w_en0008.
              LOOP AT it_0008 INTO wa_0008.
                w_st0008 = wa_0008-begda.
                w_en0008 = wa_0008-endda.
                EXIT.
              ENDLOOP.
              CLEAR : wa_rt.
              REFRESH : it_rt.
              CALL FUNCTION 'RP_FILL_WAGE_TYPE_TABLE'
                EXPORTING
                  begda                        = w_st0008
                  endda                        = w_en0008
                  infty                        = '0008'
                  pernr                        = wa_0001-pernr
                TABLES
                  ppbwla                       = it_rt
                EXCEPTIONS
                  error_at_indirect_evaluation = 1
                  OTHERS                       = 2.
              LOOP AT it_rt INTO wa_rt.
                CLEAR : w_var.
                IF wa_rt-lgart         = '5000' AND         "Basic
                   wa_lgart-lgart        = '5000'.
                  w_var = 12 - pnppabrp.
                  wa_income-proj = wa_rt-betrg * w_var.
                  wa_income-lgart = wa_rt-lgart.
    **---Here we are checking for the arrers of Basic to deduct from the
    *cummulation amount...
                  READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                             WITH KEY lgart = '7000'.
                  IF sy-subrc = 0.
                    wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                  ENDIF.
                ENDIF.
                IF wa_rt-lgart         = '5001' AND         "HRA
                   wa_lgart-lgart        = '5001'.
                  w_var = 12 - pnppabrp.
                  wa_income-proj = wa_rt-betrg * w_var.
                  wa_income-lgart = wa_rt-lgart.
    **---Here we are checking for the arrers of HRA to deduct from the
    *cummulation amount...
                  READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                             WITH KEY lgart = '7001'.
                  IF sy-subrc = 0.
                    wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                  ENDIF.
                ENDIF.
                IF wa_rt-lgart         = '5003' AND         "Conveyance
                   wa_lgart-lgart        = '5003'.
                  w_var = 12 - pnppabrp.
                  wa_income-proj = wa_rt-betrg * w_var.
                  wa_income-lgart = wa_rt-lgart.
    **---Here we are checking for the arrers of Conveyance to deduct from
    *the cummulation amount...
                  READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                             WITH KEY lgart = '7003'.
                  IF sy-subrc = 0.
                    wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                  ENDIF.
                ENDIF.
                IF wa_rt-lgart         = '5005' AND         "Special Pay
                   wa_lgart-lgart        = '5005'.
                  w_var = 12 - pnppabrp.
                  wa_income-proj = wa_rt-betrg * w_var.
                  wa_income-lgart = wa_rt-lgart.
    **---Here we are checking for the arrers of Special pay to deduct from
    *the cummulation amount...
                  READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                             WITH KEY lgart = '7005'.
                  IF sy-subrc = 0.
                    wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                  ENDIF.
                ENDIF.
                IF wa_rt-lgart         = '5002' AND         "CLA
                   wa_lgart-lgart        = '5002'.
                  w_var = 12 - pnppabrp.
                  wa_income-proj = wa_rt-betrg * w_var.
                  wa_income-lgart = wa_rt-lgart.
    **---Here we are checking for the arrers of CLA to deduct from the
    *cummulation amount...
                  READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                             WITH KEY lgart = '7002'.
                  IF sy-subrc = 0.
                    wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                  ENDIF.
                ENDIF.
              ENDLOOP.
             LOOP AT it_payrt_result-inter-rt INTO wa_payrt_result
                     WHERE lgart = wa_lgart-lgart.
               CLEAR : w_var.
               IF wa_payrt_result-lgart = '5000' AND         "Basic
                  wa_lgart-lgart        = '5000'.
                 w_var = 12 - pnppabrp.
                 wa_income-proj = wa_payrt_result-betrg * w_var.
                 wa_income-lgart = wa_payrt_result-lgart.
               ENDIF.
    ***---Here we are checking for the arrers of Basic to deduct from the
    *cummulation amount...
                 READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                            WITH KEY lgart = '7000'.
                 IF sy-subrc = 0.
    *wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                 ENDIF.
               IF wa_payrt_result-lgart = '5001' AND         "HRA
                  wa_lgart-lgart        = '5001'.
                 w_var = 12 - pnppabrp.
                 wa_income-proj = wa_payrt_result-betrg * w_var.
                 wa_income-lgart = wa_payrt_result-lgart.
               ENDIF.
    ***---Here we are checking for the arrers of HRA to deduct from the
    *cummulation amount...
                 READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                            WITH KEY lgart = '7001'.
                 IF sy-subrc = 0.
    *wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                 ENDIF.
               IF wa_payrt_result-lgart = '5003' AND         "Conveyance
                  wa_lgart-lgart        = '5003'.
                 w_var = 12 - pnppabrp.
                 wa_income-proj = wa_payrt_result-betrg * w_var.
                 wa_income-lgart = wa_payrt_result-lgart.
               ENDIF.
    ***---Here we are checking for the arrers of Conveyance to deduct from
    *the cummulation amount...
                 READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                            WITH KEY lgart = '7003'.
                 IF sy-subrc = 0.
    *wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                 ENDIF.
               IF wa_payrt_result-lgart = '5005' AND         "Special Pay
                  wa_lgart-lgart        = '5005'.
                 w_var = 12 - pnppabrp.
                 wa_income-proj = wa_payrt_result-betrg * w_var.
                 wa_income-lgart = wa_payrt_result-lgart.
               ENDIF.
    ***---Here we are checking for the arrers of Special pay to deduct from
    *the cummulation amount...
                 READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                            WITH KEY lgart = '7005'.
                 IF sy-subrc = 0.
    *wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                 ENDIF.
               IF wa_payrt_result-lgart = '5002' AND         "CLA
                  wa_lgart-lgart        = '5002'.
                 w_var = 12 - pnppabrp.
                 wa_income-proj = wa_payrt_result-betrg * w_var.
                 wa_income-lgart = wa_payrt_result-lgart.
               ENDIF.
    ***---Here we are checking for the arrers of CLA to deduct from the
    *cummulation amount...
                 READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                            WITH KEY lgart = '7002'.
                 IF sy-subrc = 0.
    *wa_income-cumm = wa_income-cumm - wa_payrt_result-betrg.
                 ENDIF.
             ENDLOOP.
              IF wa_lgart-lgart = '5065'.
                READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                           WITH KEY lgart = '5065'.
                IF sy-subrc = 0.
                  wa_income-particular = wa_lgart-lgtxt.
                  wa_income-lgart      = wa_lgart-lgart.
                  wa_income-cumm       = wa_payrt_result-betrg.
                  wa_income-proj       = 0.
                ENDIF.
              ENDIF.
              CLEAR : wa_payrt_result.
              IF wa_lgart-lgart = '5001'.
                "HRA Exemptions
                READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                           WITH KEY lgart = '/4E4'.
                IF sy-subrc = 0.
                  wa_income-exem = wa_payrt_result-betrg.
                 wa_income-lgart = wa_payrt_result-lgart.
                ENDIF.
              ENDIF.
              CLEAR : wa_payrt_result.
              IF wa_lgart-lgart = '5003'.
                "Conveyance Exemptions
                READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                           WITH KEY lgart = '/4E3'.
                IF sy-subrc = 0.
                  wa_income-exem = wa_payrt_result-betrg.
                 wa_income-lgart = wa_payrt_result-lgart.
                ENDIF.
              ENDIF.
              CLEAR : wa_payrt_result.
              IF wa_lgart-lgart = '5025'.
                "Leave Encashment
                READ TABLE it_payrt_result-inter-rt INTO wa_payrt_result
                           WITH KEY lgart = '/4E7'.
                IF sy-subrc = 0.
                  wa_income-particular = wa_lgart-lgtxt.
                 wa_income-lgart      = wa_payrt_result-lgart.
                  wa_income-cumm       = wa_payrt_result-betrg.
                  wa_income-exem       = wa_payrt_result-betrg.
                ENDIF.
              ENDIF.
    **---Here we are calculating the annual field of the IT it_income....
              wa_income-annu = ( wa_income-cumm + wa_income-proj ) -
              wa_income-exem.
              IF wa_income IS NOT INITIAL.
                APPEND wa_income TO it_income.
              ENDIF.
            ENDIF.
          ENDLOOP.
        ENDLOOP.
        READ TABLE  it_payrt_result-inter-rt INTO wa_payrt_result
                    WITH KEY lgart = '5038'.
        IF sy-subrc EQ 0.
          READ TABLE it_lgart INTO wa_lgart WITH KEY lgart = '5038'.
          wa_wage-annu       = wa_payrt_result-betrg.
          wa_wage-particular = wa_lgart-lgtxt.
          wa_wage-lgart      = w_lgart.
          wa_wage-cumm       = wa_payrt_result-betrg.
          APPEND wa_wage TO it_wage.
        ENDIF.
    **---Here we are looping the RGDIR internal table for the LTA Amount in
    *Offcycle....
        LOOP AT it_pc261 INTO wa_pc261 WHERE fpper = '000000'
                                       AND   srtza = 'A'.
          IF w_flag IS INITIAL.
            IF wa_pc261-fpbeg+4(2) = '01' OR
               wa_pc261-fpbeg+4(2) = '02' OR
               wa_pc261-fpbeg+4(2) = '03'.
              w_year = wa_pc261-fpbeg+0(4) - 1.
              w_pr_from1 = w_year.
            ELSE.
              w_pr_from1 = wa_pc261-fpbeg+0(4).
            ENDIF.
            IF wa_pc261-fpbeg+4(2) EQ '01'.
              w_pr_to1 = '10'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '02'.
              w_pr_to1 = '11'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '03'.
              w_pr_to1 = '12'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '04'.
              w_pr_to1 = '01'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '05'.
              w_pr_to1 = '02'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '06'.
              w_pr_to1 = '03'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '07'.
              w_pr_to1 = '04'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '08'.
              w_pr_to1 = '05'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '09'.
              w_pr_to1 = '06'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '10'.
              w_pr_to1 = '07'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '11'.
              w_pr_to1 = '08'.
            ELSEIF wa_pc261-fpbeg+4(2) EQ '12'.
              w_pr_to1 = '09'.
            ENDIF.
            CONCATENATE w_pr_from1 w_pr_to1 INTO w_fpper-low1.
            IF w_period = w_fpper-low1.
              w_flag = 'X'.
              CLEAR : wa_payrt_result.
    **---Importing the Payroll cluster results for each employee from RT....
              CALL FUNCTION 'PYXX_READ_PAYROLL_RESULT'
                EXPORTING
                  clusterid                    = w_clstrid
                  employeenumber               = wa_0001-pernr
                  sequencenumber               = wa_pc261-seqnr
                CHANGING
                  payroll_result               = it_payrt_result
                EXCEPTIONS
                  illegal_isocode_or_clusterid = 1
                  error_generating_import      = 2
                  import_mismatch_error        = 3
                  subpool_dir_full             = 4
                  no_read_authority            = 5
                  no_record_found              = 6
                  versions_do_not_match        = 7
                  error_reading_archive        = 8
                  error_reading_relid          = 9
                  OTHERS                       = 10.
              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 it_lgart INTO wa_lgart WHERE lgart = '5039'.
                "LTA
                LOOP AT it_payrt_result-inter-crt INTO wa_paycrt_result
                        WHERE lgart = '5039' AND cumty = 'C'.
                  w_lgtxt = wa_lgart-lgtxt.
                  w_lgart = wa_paycrt_result-betrg.
                  w_cumm  = wa_paycrt_result-betrg.
                ENDLOOP.
              ENDLOOP.
            ENDIF.
          ENDIF.
        ENDLOOP.
    **---Here we are looping through the RT table to get the LTA Exemptions
    *Amount....
        LOOP AT it_payrt_result-inter-rt INTO wa_payrt_result
                WHERE lgart = '/4E5'.                    "LTA Exemptions
          w_ltaexe = wa_payrt_result-betrg.
          wa_income-particular = w_lgtxt.
          wa_income-lgart      = w_lgart.
          wa_income-cumm       = w_cumm.
          wa_income-exem       = w_ltaexe.
        ENDLOOP.
    **---Here we are deducting the arrears amount from the original wagetype
    *of the
    **---arrear and then calculating the total of the annual column....
       CLEAR : wa_income.
       LOOP AT it_income INTO wa_income.
         CLEAR : w_wage.
         IF wa_income-lgart+0(1) = '5'.
           CONCATENATE '7' wa_income-lgart+1(3) INTO w_wage.
           READ TABLE it_income INTO wa_in WITH KEY lgart = w_wage.
           IF sy-subrc = 0.
             CLEAR : w_amount.
             w_amount = wa_in-annu.
             wa_income-annu = wa_income-annu - w_amount.
             MODIFY it_income FROM wa_income TRANSPORTING annu.
           ENDIF.
         ENDIF.
       ENDLOOP.
        APPEND LINES OF it_wage TO it_income.
    **---perform to get the data of the Investments of the employee...
        PERFORM f00_investmants USING wa_0001.
        LOOP AT it_income INTO wa_income.
          READ TABLE it_0000 INTO wa_0000 WITH KEY pernr = wa_0001-pernr
                                                   massn = 'GO'.
          IF sy-subrc EQ 0 AND wa_0000-begda0(6) = w_cdate0(6).
            CLEAR wa_income-proj.
            wa_income-annu = wa_income-cumm - wa_income-exem.
            MODIFY it_income FROM wa_income.
          ENDIF.
        ENDLOOP.
        LOOP AT it_income INTO wa_income.
          READ TABLE it_0000 INTO wa_0000 WITH KEY pernr = wa_0001-pernr
                                                   massn = 'FF'.
          IF sy-subrc EQ 0 AND wa_0000-begda0(6) = w_cdate0(6).
            CLEAR wa_income-proj.
            wa_income-annu = wa_income-cumm - wa_income-exem.
            MODIFY it_income FROM wa_income.
          ENDIF.
        ENDLOOP.
    **---Perform to reach to the Income chargable to Tax of the Employee....
        PERFORM f001_chargeable_income USING wa_0001.
    **---perform to display the data in IT form.....
        PERFORM f00_output_data TABLES it_income it_deduct it_invest
                                USING  wa_0001.
      ENDLOOP.
    ENDFORM.                    " f000_get_income
    *&      Form  f00_output_data
          text
         -->P_IT_INCOME  text
         -->P_WA_0001  text
    FORM f00_output_data  TABLES   p_it_income STRUCTURE wa_income
                                   p_it_deduct STRUCTURE wa_deduct
                                   p_it_invest STRUCTURE wa_invest
                          USING    p_wa_0001 TYPE pa0001.
      CLEAR : w_dept, w_desig, w_join.
      rp-provide-from-last p0001 space '18000101' '99991231'.
      rp-provide-from-frst p0000 space '18000101' '99991231'.
      w_join = p0000-begda.
      SELECT SINGLE plstx FROM t528t INTO w_desig
                      WHERE sprsl = 'E'
                      AND   plans = p0001-plans.
      SELECT SINGLE orgtx FROM t527x INTO w_dept
                    WHERE sprsl = 'E'
                    AND   orgeh = p0001-orgeh.
      WRITE : /.
      WRITE : / 'EMPLOYEE NUMBER :',
              p_wa_0001-pernr.
      WRITE AT 35 'EMPLOYEE NAME :'.
      WRITE : p_wa_0001-ename.
      WRITE : / 'DEPARTMENT      :',
              w_dept.
      WRITE AT 35 'DESIGNATION   :'.
      WRITE : w_desig.
      WRITE : / 'DATE OF JOINING :',
              w_join.
    **---Here we are starting the output of the IT Report....
      WRITE : /.
      ULINE.
      WRITE AT 28 'INCOME TAX CALCULATION'.
      ULINE.
      WRITE : /.
      WRITE : / 'Particulars'.
      WRITE AT 26 'Cummulative Total'.
      WRITE AT 45 'Add:Projected'.
      WRITE AT 61 'Less:Exempted'.
      WRITE AT 77 'Annual. Rs.'.
      WRITE : /.
      LOOP AT p_it_income INTO wa_income.
        CLEAR : wa_income1.
        WRITE wa_income-particular TO wa_income1-particular.
        WRITE wa_income-lgart RIGHT-JUSTIFIED TO wa_income1-lgart.
        WRITE wa_income-cumm RIGHT-JUSTIFIED TO wa_income1-cumm.
        WRITE wa_income-proj RIGHT-JUSTIFIED TO wa_income1-proj.
        WRITE wa_income-exem RIGHT-JUSTIFIED TO wa_income1-exem.
        WRITE wa_income-annu RIGHT-JUSTIFIED TO wa_income1-annu.
        APPEND wa_income1 TO it_income1.
      ENDLOOP.
      LOOP AT it_income1 INTO wa_income1.
        WRITE : / wa_income1-particular LEFT-JUSTIFIED UNDER 'Particulars',
                wa_income1-cumm       UNDER 'Cummulative Total',
                wa_income1-proj       UNDER 'Add:Projected',
                wa_income1-exem       UNDER 'Less:Exempted',
                wa_income1-annu       UNDER 'Annual. Rs.'.
         w_total = w_total + wa_income-annu.
     

  • Losing network connection when loading new firmware from iTunes (or syncing

    Noticed this when loading 1.1.1 weeks ago and now 1.1.2. Several times during the download/installation process, I lost my network connection. Rebooting the PC restored it, only to have it go down again, requiring another reboot. Required several PC (not iPhone) reboots to be able to complete the process. This happens only during this process -- I otherwise never lose my network connection and always enjoy super speed. Paid it no mind and dismissed as a fluke during 1.1.1 upload, but was surprised to see it again this time. In both cases the final download and install worked perfectly. It's just a time-consuming hassle -- kinda weird -- thx much in advance for any clues about this...

    It appears the problem appears only when using torrent software.
    There is a lot of discussion on different torrent software forums about this, and directions on how to get around this issue. However with my skills I only managed to get Vuze to work properly while killing the network access from all other application. So i just went back to default settings.
    I give up for now, I'll wait until Apple releases OS X update that works together with these programs (like it did in tiger and earlier versions..) or if it's even possible, one of the programs finds a way to get around this issue.

  • How do I remove the white space when importing a site from Flash?

    Okay, so I've dragged and dropped my created Flash site into Dreamweaver. One problem though, when I view it in a web browser (any web browser), it displays the site fine, however with a huge white space to the side of it. You'll see what I mean in this screenshot:
    What can I do then to remove that white space and make the site fill up the whole web browser? I've tried resizing it using a number of ways, but cannot seem to get it right.
    Thanks.

    function(){return A.apply(null,[this].concat($A(arguments)))}
    What can I do then to remove that white space and make the site fill up the whole web browser? I've tried resizing it using a number of ways, but cannot seem to get it right.
    You can do two things:
    1) Change the width of the container to 100%;  OR
    2) Post a link to your test page here (not the code nor picture) so that we can see ourselves what your code looks like.
    hth

  • Leverage iOS APIs from Flash/Flex?

    From looking at
    http://labs.adobe.com/wiki/index.php/Packager_for_iPhone:Developer_FAQ
    we can see that Flash content deployed to iOS CANNOT leverage any private or unpublished iOS APIs..
    My Question is can Flash content target native iOS APIs?
    For example I want to target an external VGA screen connected to an iPad.
    I am using the AIR Player's NativeWindow and Screen.
    AS3 code to get Screens:
    var screenArray:Array = Screen.screens;
    This works fine running as an AIR app on PC/Mac but the iPad doesn't see the VGA screen connected.
    So Iooks like I need to use Objective C iOS native API UIScreen.. Is this possible?
    Thanks,
    David

    I've had a few instances where I would need access to native iOS APIs to do what I need, since there is either no equivalent AS3 class, or like in your case, the equivalent does not work with the iPhone. 
    I have not been able to find a way to do it, and abandoned the idea assuming it is not possible.  If you find that it is possible I would be VERY happy if you let me know how to do it.

  • Calling C++ code from Flash/Flex

    Hi everybody!
    Does anyone know how to call a DLL (C++) -function in Flex or
    Flash with Actionscript, or any other (easy?) way to access C++
    code?
    I love developing in Flex, but actionscript is an easy
    language with some restrictions, so that's why i'd really like to
    have C++ code in Flex/Flash. :)

    Calling out to a dll of C++ would break the Flash Player
    security model. So it is prohibited. Check out Adobe Labs and look
    at the AIR runtime. Air allows
    Flex applicationS to run as desktop applications not web
    application with the web type security restrictions.
    Also some folks are developing and open source way to
    integrate Java with air.
    http://artemis.effectiveui.com/

  • Opening an HTML popup from Flash, not as tab

    Hi
    I need to open an HTML popup from Flash (using ActionScript in
    Flex 4).
    Thus far I found a solution, and it does work in Safari - a new
    and separate HTML window is popped up (with a new web page).
    private function popUpTheHtmlEditor():void {
      var url:String = "http://www.adobe.com";
      var request:URLRequest = new URLRequest(url);
      try {
        navigateToURL(request, '_blank');
      } catch (e:Error) {
        trace("Error occurred!");
    But in (my) Firefox (with my settings), when I click on the Flash
    (Flex) button, the page is being opened in a new tab.
    I need a solution which pops up the HTML page in a new/separate
    window, as far as possible regardless of the browser (and browser
    settings).
    I found an example where a popup is opened from HTML, and it opens a
    separate window (a real popup) in my Firefox:
    http://www.gtalbot.org/FirefoxSection/Popup/PopupAndFirefox.html
    -> "Open a requested popup"
    The JavaScript code seems to be:
      OpenRequestedPopup(this.href, this.target); return false;
    with this function def:
      function OpenRequestedPopup(strUrl, strTarget)
        if (WindowObjectReferenceOfRequestedPopup == null || WindowObjectReferenceOfRequestedPopup.closed)
        WindowObjectReferenceOfRequestedPopup = window.open(strUrl, strTarget, "top=" + windowTop + ",left=" + windowLeft + ",width=" + windowWidth + ",height=" + windowHeight + ",menubar,toolbar,location,resizable,scrollbars,status");
        else
        if(WindowObjectReferenceOfRequestedPopup.focus)
          WindowObjectReferenceOfRequestedPopup.focus();
    How could I call such code from ActionScript? Should this work through
    ExternalInterface? I couldn't even get this to work:
      ExternalInterface.call('alert', 'foo');
    Should I use swfobject.js for embedding the .swf in the HTML wrapper?
    Any other ideas?
    The two files are pasted below.
    Here's the compiler command I'm using:
      mxmlc -output button.swf -target-player 10.0.0 flash_to_editor.mxml
    I'm running the examples locally (as files, not over http). Would it
    help to place the files on a server?
    Tobi
    <?xml version="1.0" encoding="UTF-8"?>
    <mx:Application
      xmlns:fx="http://ns.adobe.com/mxml/2009"
      xmlns:s="library://ns.adobe.com/flex/spark"
      xmlns:mx="library://ns.adobe.com/flex/mx"
      horizontalAlign="center" verticalAlign="middle">
      <fx:Script>
        <![CDATA[
    import mx.controls.Alert;
    import flash.external.ExternalInterface;
    import flash.net.URLRequest;
    // This 'http://www.adobe.com' is just an example URL.
    // Works but opens tab in FF (not a separate window):
    private function popUpTheHtmlEditor():void {
      var url:String = "http://www.adobe.com";
      var request:URLRequest = new URLRequest(url);
      try {
        navigateToURL(request, '_blank');
      } catch (e:Error) {
        trace("Error occurred!");
    // Doesn't work:
    // var url:URLRequest = new URLRequest("javascript:alert('foo'); void(0);");
    // navigateToURL(url, "_self");
    // How to get this to work?
    private function popUpTheHtmlEditor():void {
      ExternalInterface.call('alert', 'foo');
    // How to get this to work?
    private function popUpTheHtmlEditor():void {
      ExternalInterface.call('launch','http://www.adobe.com');
      // Or
      // ExternalInterface.call("window.open", "http://www.adobe.com", "win", "height=200,width=300,toolbar=no,scrollbars=yes");
    // Perhaps it's necessary to try different approaches:
    // (As soon as I get two approaches to work.)
    private function popUpTheHtmlEditor():void {
      var s:String;
      if (ExternalInterface.available) {
        // Necessary? Safe?:
        // Security.allowDomain('*');
        s = ExternalInterface.call('launch','http://www.adobe.com');
      } else {
         // TODO: Then try URLRequest?
         s = "Wrapper not available";
      Alert.show(s);
        ]]>
      </fx:Script>
      <s:Panel title="One way to open the HTML editor"
      width="75%" height="75%">
        <s:Button id="button" label="Open the HTML editor"
        click="this.popUpTheHtmlEditor();"
        horizontalCenter="0" verticalCenter="0"/>
      </s:Panel>
    </mx:Application>
    <html
      xmlns="http://www.w3.org/1999/xhtml"
      xml:lang="en" lang="en">
      <head>
        <title>html_around_swf.html</title>
        <script type="text/javascript">
    function launch(url) {
      alert(url);
      //  OpenWin = this.open(url, "FOO", "toolbar=no,menubar=no,location=no,scrollbars=yes,resizable=no,width=400,height=200");
        </script>
      </head>
      <body>
        <object id="button" name="button" width="550" height="400"
        classid="clsid:d27cdb6e-ae6d-11cf-96b8-444553540000">
          <param name="movie" value="button.swf" />
          <param name="allowScriptAccess" value="always" />
          <embed id="foo" name="button" src="button.swf" width="550" height="400"></embed>
        </object>
      </body>
    </html>

    Hi, 
    Here's a solution.
    1. Make ExternalInterface work when files are loaded as local files: 
    Go to
    http://www.macromedia.com/support/documentation/en/flashplayer/help/settings_manager04.htm l 
    In tab Global Security Settings: Edit Locations -> Add Location ->
    browse to the .swf file, add it. Make sure it's in the list (under the
    Edit Locations drop down, with a green check mark.) 
    Now open the HTML wrapper in a browser (eg Firefox). 
    Now this works (ActionScript): 
    private function popUpTheHtmlEditor():void {
      ExternalInterface.call('alert', 'foo');
    On Windows: perhaps:
    http://techjig.blogspot.com/2008/03/flash-global-security-settings-windows.html
    "In order for external interface functions to be called, you must also
    specify the folder/file where the swf file is located." 
    The above setup isn't necessary when the files are on a server. 
    Also see: 
    http://help.adobe.com/en_US/FlashPlatform/reference/actionscript/3/flash/external/External Interface.html#call()
    ""ExternalInterface" "
    "call() method" 
    http://help.adobe.com/en_US/flex/using/WS2db454920e96a9e51e63e3d11c0bf69084-7ea6.html
    "About ExternalInterface API security in Flex" 
    http://help.adobe.com/en_US/flex/using/WS2db454920e96a9e51e63e3d11c0bf626ae-7fe8.html#WS2d b454920e96a9e51e63e3d11c0bf69084-7f31
    "Using the ExternalInterface API to access JavaScript" 
    2. Open a real popup: Example: 
    ActionScript: 
    private function popUpSomething():void {
      var editorPathOrUrl:String =
        'wrapper.html';
      var windowName:String =
        "SomeNameSeeDocs";
      var windowFeatures:String =
        "toolbar=yes,menubar=yes,location=yes,scrollbars=yes,resizable=yes,width=500,height=700";
      ExternalInterface.call(
        'launch',editorPathOrUrl,windowName,windowFeatures
    JavaScript: 
    function launch(editorPathOrUrl,windowName,windowFeatures) {
      windowRef = window.open(
        editorPathOrUrl,windowName,windowFeatures
    Works in all browser I tested except Opera. 
    Tobi

  • Upgrade from Flash player 7 to Flash Player 9

    I have two website with many Flash image with url. When the
    users upgraded from Flash player 7 to Flash Player 9, the links
    don't work. I uninstalled the version 9 and installed version 7
    again and the website works fine. Help me please!!!

    I have tried for 2 days to get the latest version of Flash
    player to download and nothing works. I've done everything that was
    suggested, I believe.
    I would appreciate any help that I can get in installing this
    as I cannot see any videos at all in websites. I don't understand
    why it isn't working.

  • Export image from Flash to .ai or .eps and keep transparent colors.

    Is there a way to, when I have finished this wonderful
    drawing in Flash with transparent colors, to keep them when I
    export them from Flash to Illustrator as an .ai or .eps?
    I'd like my images to be scalable and rezizable (to be able
    to be really BIG) when I deliver them.
    Please help! I use Flash MX and Illustrator CS.
    Lisa

    > Is there a way to, when I have finished this wonderful
    drawing in Flash with
    > transparent colors, to keep them when I export them from
    Flash to Illustrator
    > as an .ai or .eps?
    What happens when you import them into Illustrator?
    Christian Scholz-Flöter

  • URL for BSP from Work flow(Portal)

    Hi .,
    Please let me know how we can pass a URL for BSP from Email . Which would be initiated from Work flow(portal)   .
    thanks
    Sreenivas reddy

    Hi,
    I hope the below links will help you.
    How to open BSP page when clicking a URL from E-mail.
    Navigating to a BSP (URL) from PCUI
    Thanks,
    Khushboo.

  • Close portal (session) when calling external url

    Hi there,
    does anyone know if its possible and if yes, how to automatically close a portal session when (or after) calling an external url from within the portal.
    Cheers
    Walter

    i think you can write a script for this using EPCF.
    Shankar

  • "media server application expectly quit" when submitting from final cut pro

    browsing through the list, it seems the problem couldn´t be solved so far.
    doing some systematic testing, the following riddle shows up:
    ... when adding a QT ref movie (or movie) directly to the compressor batch list and submit to the cluster, everything runs fine.
    ... when exporting from final cut pro:
    menu -> export -> using compressor ...
    submitting in compressor using:
    1) Cluster: this computer: everything keeps running fine.
    2) Cluster: MylovelyCluster ....
    the job fails with the message "Failed: HOST [clusternode_name.local] media server application unexpectedly quit"
    since there is 5TB + of data to be compressed, copying files to the render nodes is not an option. all data is on a shared xraid, connected via giganet.
    Any ideas, any hints appreciated !
    regards,
    p.s. Anybody running an XSAN having the same issues?
    G5s, G4s, G3s, macminis, powerbooks   Mac OS X (10.4.7)   xraid

    ... well, the answer is in other topics.
    showstopper explains it patently again and again ...
    thanks from here.
    shortly: when submitting from FCP, every node HAS to have FCP installed and MUST have access to the same relative file path (mounted shared volume). If the volume is not present, the render node will open the reconnect media dialogue and waits for user input.

  • When we synch data from AD to FIM Portal 2010 r2 the data is not updates in FIM Portal.

    Hi,
    When we synch data from AD to FIM Portal 2010 r2 the data is not updates in FIM Portal.
    Active directory attribute co have value vietnam but in FIM Portal country attribute have value VIET NAM
    we simply mapped AD Attribite to FIM Attribute for inbound
    co===>country
    why this happen
    Regards
    Anil Kumar

    Anil, please check what do you have in metaverse. It seems that you have attribute flow precedence configured in a way that doesn't export to FIM Portal.
    Let's say you have flows like:
    (AD MA)
    Import flow: (AD) description -> (metaverse) description
    (FIM MA)
    Import flow (FIM) description -> (metaverse) description
    Export flow (FIM) description <- (metaverse) description
    And you have higher precedence from FIM. Then, you would never have FIM value updated - even if value in AD changes. It would be exported to FIM only when you don't have this attribute filled in FIM.
    If you found my post helpful, please give it a Helpful vote. If it answered your question, remember to mark it as an Answer.

Maybe you are looking for