Any one can give this solotion

if one document no having more than matiral no then waht is coding for that

REPORT YVREE024 LINE-SIZE 185 LINE-COUNT 63 NO STANDARD PAGE HEADING.
      DATA DECLARATIONS                                             *
TABLES:  VBAK, VBAP, VBEP, KNA1, TVFST, TVLST.
Selection screens.
mandatory parameters
SELECTION-SCREEN  BEGIN OF BLOCK PARAMETERS
                  WITH FRAME
                  TITLE TEXT-020 .
PARAMETERS:       P_VKORG LIKE VBAK-VKORG OBLIGATORY ,
                  P_VTWEG LIKE VBAK-VTWEG OBLIGATORY ,
                  P_SPART LIKE VBAK-SPART OBLIGATORY .
SELECTION-SCREEN  END OF BLOCK PARAMETERS.
optional selection ranges
SELECTION-SCREEN  BEGIN OF BLOCK SELECT_CRITERIA
                  WITH FRAME
                  TITLE TEXT-010 .
SELECT-OPTIONS:
                  S_VKBUR FOR VBAK-VKBUR,
                  S_VKGRP FOR VBAK-VKGRP,
                  S_KUNNR FOR VBAK-KUNNR.
SELECTION-SCREEN  END OF BLOCK SELECT_CRITERIA .
Order header table.
DATA: BEGIN OF I_VBAK OCCURS 0,
      VBELN LIKE VBAK-VBELN,
      KUNNR LIKE VBAK-KUNNR,
      FAKSK LIKE VBAK-FAKSK,           "billing block
      LIFSK LIKE VBAK-LIFSK,           "delivery block
      END OF I_VBAK.
report table
DATA: BEGIN OF ITAB OCCURS 0,
           VBELN LIKE VBAP-VBELN,      " Order Number
           KUNNR LIKE VBAK-KUNNR,      " Customer Number
           NAME1 LIKE KNA1-NAME1,      " Customer Name
           ERNAM LIKE VBAK-ERNAM,      " User created
           POSNR LIKE VBAP-POSNR,      " Line Item
           MATNR LIKE VBAP-MATNR,      " Material Number
           KWMENG LIKE VBAP-KWMENG,    " Quantity
           MEINS LIKE VBAP-MEINS,      " Unit of measure
           NETWR LIKE VBAP-NETWR,      " value
           FAKSP LIKE VBAP-FAKSP,      " billing block
           LIFSP LIKE VBEP-LIFSP,      " delivery block
END OF ITAB.
INITIALIZATION .
  GET PARAMETER ID 'VKO' FIELD P_VKORG.
  GET PARAMETER ID 'VTW' FIELD P_VTWEG.
  GET PARAMETER ID 'SPA' FIELD P_SPART.
START-OF-SELECTION .
populate vbak table from selection criteria with headers that have
billing or delivery blocks
  PERFORM SELECT_DOCUMENTS.
select blocked items from documents selected from vbak
  PERFORM SELECT_BLOCKED_ITEMS.
END-OF-SELECTION.
  SORT ITAB BY VBELN POSNR.
print report from internal table
  PERFORM PRINT_REPORT.
run report of orders with payment block on customer
SUBMIT YVREE025  EXPORTING LIST TO MEMORY
                AND RETURN
                WITH P_VKORG = P_VKORG
                WITH P_VTWEG = P_VTWEG
                WITH P_SPART = P_SPART
                WITH S_VKBUR IN S_VKBUR
                WITH S_VKGRP IN S_VKGRP
                WITH S_KUNNR IN S_KUNNR.
DATA: ABAPLIST LIKE ABAPLIST OCCURS 0.
recover YVREE025 report and display
CALL FUNCTION 'LIST_FROM_MEMORY'
     TABLES
          LISTOBJECT = ABAPLIST
     EXCEPTIONS
          NOT_FOUND  = 1
          OTHERS     = 2.
*if sy-batch = space.
CALL FUNCTION 'DISPLAY_LIST'
     EXPORTING
          FULLSCREEN            = 'X'
        CALLER_HANDLES_EVENTS =
     IMPORTING
          USER_COMMAND          = SY-UCOMM
     TABLES
          LISTOBJECT            = ABAPLIST
     EXCEPTIONS
          EMPTY_LIST            = 1
          OTHERS                = 2.
*else.
using write_list duplicates yvree024 headings on yvree025 list
display_list prints ok in background as long as print immediately is
NOT switched off
*call function 'WRITE_LIST'
    tables
         listobject = abaplist
    exceptions
         empty_list = 1
         others     = 2.
*endif.
TOP-OF-PAGE.
write top of page title.
  PERFORM WRITE_TITLE .
write column headings.
  PERFORM WRITE_HEADER.
*&      Form  SELECT_DOCUMENTS
      select order header details from vbak depending on selection
      criteria entered
FORM SELECT_DOCUMENTS.
  SELECT VBELN KUNNR LIFSK FAKSK
         FROM  VBAK INTO CORRESPONDING FIELDS OF TABLE I_VBAK
         WHERE  VKORG       = P_VKORG
         AND    VTWEG       = P_VTWEG
         AND    SPART       = P_SPART
         AND    VKGRP      IN S_VKGRP
         AND    VKBUR      IN S_VKBUR
         AND    KUNNR      IN S_KUNNR.
ENDFORM.                               " SELECT_DOCUMENTS
*&      Form  SELECT_BLOCKED_ITEMS
      check extracted documents for blocks                           *
FORM SELECT_BLOCKED_ITEMS.
process oders selected
  LOOP AT I_VBAK.
if order blocked at header level select all items
    IF I_VBAK-FAKSK NE SPACE OR I_VBAK-LIFSK NE SPACE.
      PERFORM SELECT_ALL_ITEMS.
    ELSE.
check for block at item level
      SELECT VBELN POSNR MATNR KWMENG MEINS NETWR FAKSP  ERNAM
                FROM  VBAP INTO
          (VBAP-VBELN,  VBAP-POSNR, VBAP-MATNR, VBAP-KWMENG, VBAP-MEINS,
             VBAP-NETWR, VBAP-FAKSP, VBAP-ERNAM)
             WHERE  VBELN       = I_VBAK-VBELN.
        IF VBAP-FAKSP NE SPACE.
          CLEAR ITAB.
          MOVE-CORRESPONDING VBAP TO ITAB.
          MOVE I_VBAK-KUNNR TO ITAB-KUNNR.
          APPEND ITAB.
        ELSE.
check for block at delivery level
          SELECT LIFSP WMENG FROM  VBEP INTO
                (VBEP-LIFSP, VBEP-WMENG)
                 WHERE  VBELN       = I_VBAK-VBELN
                 AND    POSNR       = VBAP-POSNR.
            IF VBEP-LIFSP NE SPACE.
              CLEAR ITAB.
              MOVE-CORRESPONDING VBAP TO ITAB.
              MOVE I_VBAK-KUNNR TO ITAB-KUNNR.
use schedule qty
              MOVE VBEP-WMENG TO ITAB-KWMENG.
and reason
              MOVE VBEP-LIFSP TO ITAB-LIFSP.
recalculate value
              ITAB-NETWR = ITAB-NETWR / VBAP-KWMENG * VBEP-WMENG.
              APPEND ITAB.
            ENDIF.
          ENDSELECT.
        ENDIF.
      ENDSELECT.
    ENDIF.
  ENDLOOP.
ENDFORM.                               " SELECT_BLOCKED_ITEMS
*&      Form  PRINT_REPORT
      text                                                           *
FORM PRINT_REPORT.
  DATA: W_REASON_TEXT(25).
  LOOP AT ITAB.
get name
    SELECT SINGLE NAME1 FROM  KNA1 INTO KNA1-NAME1
           WHERE  KUNNR       = ITAB-KUNNR .
get reason text
    IF ITAB-FAKSP NE SPACE.
      SELECT SINGLE VTEXT  FROM  TVFST INTO W_REASON_TEXT
             WHERE  SPRAS       = SY-LANGU
             AND    FAKSP       = ITAB-FAKSP .
    ELSE.
      SELECT SINGLE VTEXT FROM  TVLST INTO W_REASON_TEXT
             WHERE  SPRAS       = SY-LANGU
             AND    LIFSP       = ITAB-LIFSP.
    ENDIF.
    WRITE: / SY-VLINE , (10) ITAB-VBELN,
            SY-VLINE , (10) ITAB-KUNNR,
            SY-VLINE , (35) KNA1-NAME1,
            SY-VLINE , (12) ITAB-ERNAM,
            SY-VLINE , (6) ITAB-POSNR,
            SY-VLINE , (18) ITAB-MATNR,
            SY-VLINE , (10) ITAB-KWMENG DECIMALS 0,
            SY-VLINE , (3) ITAB-MEINS,
            SY-VLINE , (15) ITAB-NETWR,
            SY-VLINE , (02) ITAB-LIFSP,
            SY-VLINE , (02) ITAB-FAKSP,
            SY-VLINE , (25) W_REASON_TEXT,
            SY-VLINE .
  ENDLOOP.
  WRITE:/1(185) SY-ULINE.
ENDFORM.                               " PRINT_REPORT
      FORM WRITE_TITLE                                              *
Form to write top of page title.                                    *
FORM WRITE_TITLE.
  WRITE:/1(185) SY-ULINE.
  WRITE:/   'Pirelli Cables Limited'      ,
          40 SY-TITLE   ,              " Report title
         120 'Date  :'  ,  130 SY-DATUM   .
  WRITE:/120 'Page  :'  ,
         130 SY-PAGNO   ,              " Page number of the report
         160 'YV24 / YVREE024 /', SY-MANDT.
  WRITE:/160 'Report 2 of 2'.
  WRITE:/1(185) SY-ULINE.
format color col_heading intensified off.
  WRITE:/(25) 'Report generated for; ',
          'Sales Organisation:',
          P_VKORG    ,
         '        Distribution Channel:',
           P_VTWEG,
         '        Division:',
           P_SPART.
  WRITE: /27
           'Sales Office:',
            S_VKBUR-LOW.
  IF S_VKBUR-HIGH NE SPACE.
    WRITE: ' - ', S_VKBUR-HIGH.
  ENDIF.
  WRITE: 59 ' Sales Group:',
             S_VKGRP-LOW.
  IF S_VKGRP-HIGH NE SPACE.
    WRITE: ' - ', S_VKGRP-HIGH.
  ENDIF.
  WRITE: 92 ' Customer:',
              S_KUNNR-LOW.
  IF S_KUNNR-HIGH NE SPACE.
    WRITE: ' - ', S_KUNNR-HIGH.
  ENDIF.
  WRITE:/1(185) SY-ULINE.
ENDFORM.
      FORM WRITE-HEADER                                             *
  Form to write Column headings                                     *
FORM WRITE_HEADER.
  SKIP.
  FORMAT COLOR COL_HEADING INTENSIFIED.
  WRITE:/1(185) SY-ULINE.
  WRITE:/
          SY-VLINE , (10) '   Order  ' ,
          SY-VLINE , (10) ' Customer ' ,
          SY-VLINE , (35) ' Name     ' ,
          SY-VLINE , (12) ' User created',
          SY-VLINE , (06) ' Item '     ,
          SY-VLINE , (18) '   Material',
          SY-VLINE , (10) 'Quantity' CENTERED DECIMALS 0,
          SY-VLINE , (03) 'UOM'        ,
          SY-VLINE , (15) ' Value     ',
          SY-VLINE , (02) 'DB',
          SY-VLINE , (02) 'BB',
          SY-VLINE , (25) ' Reason',
          SY-VLINE .
ENDFORM.
*&      Form  SELECT_ALL_ITEMS
  select  all items for this  header when blocked at header level   *
FORM SELECT_ALL_ITEMS.
  SELECT VBELN POSNR MATNR KWMENG MEINS NETWR ERNAM
            FROM  VBAP INTO
      (VBAP-VBELN,  VBAP-POSNR, VBAP-MATNR, VBAP-KWMENG, VBAP-MEINS,
         VBAP-NETWR, VBAP-ERNAM)
REMOVED                 appending corresponding fields of table itab
         WHERE  VBELN       = I_VBAK-VBELN.
    MOVE-CORRESPONDING VBAP TO ITAB.
    MOVE I_VBAK-FAKSK TO ITAB-FAKSP.
    MOVE I_VBAK-LIFSK TO ITAB-LIFSP.
    MOVE I_VBAK-KUNNR TO ITAB-KUNNR.
    APPEND ITAB.
  ENDSELECT.
ENDFORM.                               " SELECT_ALL_ITEMS

Similar Messages

  • My iphone 5 is problem facing like that. when i switch off my iphone5 then plugh for charge with data cable or charger adapder or only data cable with no power connect phone is starting why? means on my phone Why? any one can explane this matter please. s

    my iphone 5 is problem facing like that. when i switch off my iphone5 then plugh for charge with data cable or charger adapder or only data cable with no power connect phone is starting why? means on my phone Why? any one can explane this matter please. switched off my phone but on without power button . what is the problem?
    Thanks
    s.m slim

    all iphone is same like that

  • Plz any one can forward this book to me!

    Hello Oracle Masters,
    Plz any one can forward this book to me! my mail id- [email protected]
    " Mastering Oracle PL/SQL: Practical Solutions By CONNOR MCDONALD, WITH CHAIM KATZ, CHRISTOPHER BECK, JOEL R. KALLMAN, AND DAVID C. KNOX"

    user600520 wrote:
    Hello Oracle Masters,I hate titles and salutations like these being thrown around. There are no "+masters+" here.. or "+gurus+".. or any form of so-called superior beings. That is simply a bunch of baloney on the part of those who claim these titles, and kind of pathetic of those who use these titles to curry favour.
    Plz any one can forward this book to me! my mail id- [email protected]
    It is silly to share your e-mail address in a public forum. It only opens your mailbox to abuse and spam
    " Mastering Oracle PL/SQL: Practical Solutions By CONNOR MCDONALD, WITH CHAIM KATZ, CHRISTOPHER BECK, JOEL R. KALLMAN, AND DAVID C. KNOX"Books are usually copyrighted and cannot be electronically copied and shared as that would be illegal. And I'm sure that you do not want to commit a crime...
    There are however books that can be read (and downloaded) on the Internet for free. Try http://docstore.mik.ua/orelly/oracle/ - these contains such books, dealing with PL/SQL.

  • Please any one can give me the details about the fi-co extraction

    if any one have a screen shots on this.please send it to my id:[email protected] will give the points

    Hi Welcome to SDN world,
    The Following are the some links where you can find out some information about FI extractions.
    http://help.sap.com/saphelp_nw04/helpdata/en/af/16533bbb15b762e10000000a114084/frameset.htm
    Re: Which tables for LO and FI...
    http://help.sap.com/bp_biv335/BI_EN/html/BW/FinancialAccounting.htm
    And one small suggestion, SDN is the world where you can explore & learn yourself. We are not at all greedy about this POINTS.
      "i will give the points"
    We are not expecting this any more.
    My intention is to highligh the  Spirit of SDN. Sorry if i am hurting. you can contact me if you have any doubts.
    [email protected]
    Wish you best of luck....

  • Hi friends any one can reply this regarding Bdc

    HI friends,
    in bdc irrepsctive of screen resolution we use one structure is used .for table controls...
    can u kindly tell me what is that...i just forgotten...and if code avialable regarding that it much more useful.

    hi there..
    Following is a sample code of handling table control in BDC.
    REPORT Y730_BDC5 .
    *HANDLING TABLE CONTROL IN BDC
    DATA : BEGIN OF IT_DUMMY OCCURS 0,
           DUMMY(100) TYPE C,
           END OF IT_DUMMY.
    DATA : BEGIN OF IT_XK01 OCCURS 0,
           LIFNR(10) TYPE C,
           BUKRS(4)  TYPE C,
           EKORG(4)  TYPE C,
           KTOKK(4)  TYPE C,
           NAME1(30) TYPE C,
           SORTL(10) TYPE C,
           LAND1(3)  TYPE C,
           SPRAS(2)  TYPE C,
           AKONT(6)  TYPE C,
           FDGRV(2)  TYPE C,
           WAERS(3)  TYPE C,
           END OF IT_XK01,
           BEGIN OF IT_BANK OCCURS 0,
           BANKS(3)  TYPE C,
           BANKL(10) TYPE C,
           BANKN(10) TYPE C,
           KOINH(30) TYPE C,
           LIFNR(10) TYPE C,
           END OF IT_BANK.
    DATA : IT_BDCDATA LIKE BDCDATA OCCURS 0 WITH HEADER LINE,
           IT_BDCMSGCOLL LIKE BDCMSGCOLL OCCURS 0 WITH HEADER LINE.
    CALL FUNCTION 'WS_UPLOAD'
    EXPORTING
       FILENAME                      = 'C:\VENDOR.TXT'
       FILETYPE                      = 'ASC'
    TABLES
       DATA_TAB                      = IT_DUMMY.
    LOOP AT IT_DUMMY.
      IF IT_DUMMY-DUMMY+0(2) = '11'.
        IT_XK01-LIFNR = IT_DUMMY-DUMMY+2(10).
        IT_XK01-BUKRS = IT_DUMMY-DUMMY+12(4).
        IT_XK01-EKORG = IT_DUMMY-DUMMY+16(4).
        IT_XK01-KTOKK = IT_DUMMY-DUMMY+20(4).
        IT_XK01-NAME1 = IT_DUMMY-DUMMY+24(30).
        IT_XK01-SORTL = IT_DUMMY-DUMMY+54(10).
        IT_XK01-LAND1 = IT_DUMMY-DUMMY+64(3).
        IT_XK01-SPRAS = IT_DUMMY-DUMMY+67(2).
        IT_XK01-AKONT = IT_DUMMY-DUMMY+69(6).
        IT_XK01-FDGRV = IT_DUMMY-DUMMY+75(2).
        IT_XK01-WAERS = IT_DUMMY-DUMMY+77(3).
        APPEND IT_XK01.
      ELSE.
        IT_BANK-BANKS = IT_DUMMY-DUMMY+2(3).
        IT_BANK-BANKL = IT_DUMMY-DUMMY+5(10).
        IT_BANK-BANKN = IT_DUMMY-DUMMY+15(10).
        IT_BANK-KOINH = IT_DUMMY-DUMMY+25(30).
        IT_BANK-LIFNR = IT_DUMMY-DUMMY+55(10).
        APPEND IT_BANK.
      ENDIF.
    ENDLOOP.
    LOOP AT IT_XK01.
    REFRESH IT_BDCDATA.
    perform bdc_dynpro      using 'SAPMF02K' '0100'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'RF02K-REF_LIFNR'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_field       using 'RF02K-LIFNR'
                                  IT_XK01-LIFNR.
    perform bdc_field       using 'RF02K-BUKRS'
                                  IT_XK01-BUKRS.
    perform bdc_field       using 'RF02K-EKORG'
                                  IT_XK01-EKORG.
    perform bdc_field       using 'RF02K-KTOKK'
                                  IT_XK01-KTOKK.
    perform bdc_dynpro      using 'SAPMF02K' '0110'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFA1-TELX1'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_field       using 'LFA1-NAME1'
                                  IT_XK01-NAME1.
    perform bdc_field       using 'LFA1-SORTL'
                                  IT_XK01-SORTL.
    perform bdc_field       using 'LFA1-LAND1'
                                  IT_XK01-LAND1.
    perform bdc_field       using 'LFA1-SPRAS'
                                  IT_XK01-SPRAS.
    perform bdc_dynpro      using 'SAPMF02K' '0120'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFA1-KUNNR'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_dynpro      using 'SAPMF02K' '0130'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFBK-KOINH(02)'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ENTR'.
    DATA : FNAM(20) TYPE C,
           IDX      TYPE C.
      MOVE 1 TO IDX.
    LOOP AT IT_BANK WHERE LIFNR = IT_XK01-LIFNR.
      CONCATENATE 'LFBK-BANKS(' IDX ')' INTO FNAM.
      perform bdc_field       using FNAM
                                    IT_BANK-BANKS.
      CONCATENATE 'LFBK-BANKL(' IDX ')' INTO FNAM.
      perform bdc_field       using FNAM
                                    IT_BANK-BANKL.
      CONCATENATE 'LFBK-BANKN(' IDX ')' INTO FNAM.
      perform bdc_field       using FNAM
                                    IT_BANK-BANKN.
      CONCATENATE 'LFBK-KOINH(' IDX ')' INTO FNAM.
      perform bdc_field       using FNAM
                                    IT_BANK-KOINH.
      IDX = IDX + 1.
    ENDLOOP.
    perform bdc_dynpro      using 'SAPMF02K' '0130'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFBK-BANKS(01)'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ENTR'.
    perform bdc_dynpro      using 'SAPMF02K' '0210'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFB1-FDGRV'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_field       using 'LFB1-AKONT'
                                  IT_XK01-AKONT.
    perform bdc_field       using 'LFB1-FDGRV'
                                  IT_XK01-FDGRV.
    perform bdc_dynpro      using 'SAPMF02K' '0215'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFB1-ZTERM'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_dynpro      using 'SAPMF02K' '0220'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFB5-MAHNA'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_dynpro      using 'SAPMF02K' '0310'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'LFM1-WAERS'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/00'.
    perform bdc_field       using 'LFM1-WAERS'
                                  IT_XK01-WAERS.
    perform bdc_dynpro      using 'SAPMF02K' '0320'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'WYT3-PARVW(01)'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ENTR'.
    perform bdc_dynpro      using 'SAPLSPO1' '0300'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=YES'.
    CALL TRANSACTION 'XK01' USING IT_BDCDATA
                            MODE  'A'
                           UPDATE 'S'
                         MESSAGES INTO IT_BDCMSGCOLL.
    ENDLOOP.
    FORM BDC_DYNPRO USING PROG SCR.
      CLEAR IT_BDCDATA.
      IT_BDCDATA-PROGRAM = PROG.
      IT_BDCDATA-DYNPRO  = SCR.
      IT_BDCDATA-DYNBEGIN = 'X'.
      APPEND IT_BDCDATA.
    ENDFORM.
    FORM BDC_FIELD USING FNAM FVAL.
      CLEAR IT_BDCDATA.
      IT_BDCDATA-FNAM = FNAM.
      IT_BDCDATA-FVAL  = FVAL.
      APPEND IT_BDCDATA.
    ENDFORM.
    do reward if helpful

  • Any one can give me guidance of Camera?

    I want to buy camera for traveling. Anyone can help me? I want to buy a best quality and cheap digital camera. My budget is 120-150USD.
    I hope the camera supports 3.0 Inch TFT LCD, 12M pixels, touch screen button and 8X Digital Zoom. Please kindly let me know the price and where I can buy. Thanks

    Your budget is lower. I think you can not buy high quality brand camera. But still there are lots of choices for you. You can surf online. You will find lots of OEM products from China which meet your requirements. Last week, i watch one site www.gizmograbber.com which sell OEM camera. Besides gizmograbber.com, there are other sites you can search online. I hope it will help you. Thanks

  • Any one can give the solution in terms of SQL

    I have a table like below
    Table Structure is
    1). Employee No - NUMBER(5)
    2). ATT_DATE_TIME - DATE
    3). INOUT - CHAR(1)
    the data are as below
    Employee DATE TIME IN/OUT ( I-IN, O-OUT)
    number
    2835     01/01/06     15.20     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.20     I
    2835     01/01/06     15.20     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.20     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    2835     01/01/06     15.21     I
    Here an employee has logged so many times. i want to find out the nexted duplicate / invalid log data for single employee number and date

    the raw data are
    employe number Date Time In/Out
    A1 02-May-07 08:15:25 IN
    A1 02-May-07 08:15:26 IN
    A1 02-May-07 08:15:30 IN
    A2 02-May-07 08:15:32 IN
    A2 02-May-07 08:15:34 IN
    A1 02-May-07 14:15:10 OUT
    A1 02-May-07 15:00:10 IN
    A1 02-May-07 16:15:00 OUT
    A1 02-May-07 16:15:30 OUT
    A2 02-May-07 17:25:22 OUT
    employee number 1 data are extracted from above
    employe number Date Time In/Out
    A1 02-May-07 08:15:25 IN
    A1 02-May-07 08:15:26 IN
    A1 02-May-07 08:15:30 IN
    A1 02-May-07 14:15:10 OUT
    A1 02-May-07 15:00:10 IN
    A1 02-May-07 16:15:00 OUT
    A1 02-May-07 16:15:30 OUT
    employee number 2 data are extracted from above
    employe number Date Time In/Out
    A2 02-May-07 08:15:32 IN
    A2 02-May-07 08:15:34 IN
    A2 02-May-07 17:25:22 OUT
    I want output as below
    employe number Date Time In/Out
    A1 02-May-07 08:15:25 IN
    A2 02-May-07 08:15:32 IN
    A1 02-May-07 14:15:10 OUT
    A1 02-May-07 15:00:10 IN
    A1 02-May-07 16:15:30 OUT
    A2 02-May-07 17:25:22 OUT
    employee number 1 data are extracted from output as below
    A1 02-May-07 08:15:25 IN
    A1 02-May-07 14:15:10 OUT
    A1 02-May-07 15:00:10 IN
    A1 02-May-07 16:15:30 OUT
    employee number 2 data are extracted from output as below
    employe number Date Time In/Out
    A2 02-May-07 08:15:32 IN
    A2 02-May-07 17:25:22 OUT

  • Hi i am unable to send mail from yahoo mail id.can any one help on this?

    import javax.mail.*;
    import javax.mail.internet.*;
    import javax.activation.*;
    import java.io.*;
    import java.util.Properties;
    public class MailClient
      public void sendMail(String mailServer, String from, String to,
                                 String subject, String messageBody,
                                 String[] attachments) throws
    MessagingException, AddressException
             // Setup mail server
             Properties props = System.getProperties();
             props.put("mail.smtp.host", mailServer);
             // Get a mail session
             Session session = Session.getDefaultInstance(props, null);
             // Define a new mail message
             Message message = new MimeMessage(session);
             message.setFrom(new InternetAddress(from));
             message.addRecipient(Message.RecipientType.TO, new InternetAddress(to));
             message.setSubject(subject);
             // Create a message part to represent the body text
             BodyPart messageBodyPart = new MimeBodyPart();
             messageBodyPart.setText(messageBody);
             //use a MimeMultipart as we need to handle the file attachments
             Multipart multipart = new MimeMultipart();
             //add the message body to the mime message
             multipart.addBodyPart(messageBodyPart);
             // add any file attachments to the message
             addAtachments(attachments, multipart);
             // Put all message parts in the message
             message.setContent(multipart);
             // Send the message
             Transport.send(message);
         protected void addAtachments(String[] attachments, Multipart multipart)
                         throws MessagingException, AddressException
             for(int i = 0; i<= attachments.length -1; i++)
                 String filename = attachments;
    MimeBodyPart attachmentBodyPart = new MimeBodyPart();
    //use a JAF FileDataSource as it does MIME type detection
    DataSource source = new FileDataSource(filename);
    attachmentBodyPart.setDataHandler(new DataHandler(source));
    //assume that the filename you want to send is the same as the
    //actual file name - could alter this to remove the file path
    attachmentBodyPart.setFileName(filename);
    //add the attachment
    multipart.addBodyPart(attachmentBodyPart);
    public static void main(String[] args)
    try
    MailClient client = new MailClient();
    String server="pop3.yahoo.com";
    String from="[email protected]";
    String to = "[email protected]";
    String subject="Test";
    String message="Testing";
    String[] filenames = {"c:\\gopi.txt"};
    client.sendMail(server,from,to,subject,message,filenames);
    catch(Exception e)
    e.printStackTrace(System.out);     
    while compliling this one its compiled succesfully but i am getting exception at run time like..D:\mail>java MailClient
    Exception in thread "main" java.lang.NoClassDefFoundError: com/sun/activation/re
    gistries/MailcapFile
    at javax.activation.MailcapCommandMap.loadFile(MailcapCommandMap.java:275)
    at javax.activation.MailcapCommandMap.<init>(MailcapCommandMap.java:128)
    at javax.activation.CommandMap.getDefaultCommandMap(CommandMap.java:44)
    at javax.activation.DataHandler.getCommandMap(DataHandler.java:136)
    at javax.activation.DataHandler.getDataContentHandler(DataHandler.java:568)
    at javax.activation.DataHandler.getContent(DataHandler.java:501)
    at javax.mail.internet.MimeBodyPart.updateHeaders(MimeBodyPart.java:1253)
    at javax.mail.internet.MimeMessage.updateHeaders(MimeMessage.java:2012)
    at javax.mail.internet.MimeMessage.saveChanges(MimeMessage.java:1980)
    at javax.mail.Transport.send(Transport.java:97)
    at MailClient.sendMail(MailClient.java:35)
    at MailClient.main(MailClient.java:72)
    can any one help on this....plz
    thanks in advance
    Edited by: Konapalli.Gopi on May 20, 2010 5:42 PM                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       

    Something's wrong with your CLASSPATH.
    If you're not using JDK 6, you need to include activation.jar in your CLASSPATH.
    If you've got any other jar files that define the javax.mail.* or javax.activation.* classes
    in your CLASSPATH (such as javaee.jar or j2ee.jar), remove them.

  • HT201263 I Have an iPhone 5 runnig ios 7.0.4. It wont start as the apple logo keeps on blinking when i connect to wall charger or itunes. I even tried to restore it but an error 21 is being displayed. Any one can help me in this situation

    I Have an iPhone 5 runnig ios 7.0.4. It wont start as the apple logo keeps on blinking when i connect to wall charger or itunes. I even tried to restore it but an error 21 is being displayed. Any one can help me in this situation

    Read http://support.apple.com/kb/ts3694#

  • Have just down loaded Yosemite over Mountain Lion, Indesign CS5 does not work ( Am dependant on it) although Bridge , Light Room and Elements operate OK How do I solve this rapidly. Can any one help on this issue. Thanks

    Have just down loaded Yosemite over Mountain Lion, Indesign CS5 does not work ( Am dependant on it) although Bridge , Light Room and Elements operate OK How do I solve this rapidly. Can any one help on this issue. Thanks

    Sorry to say it, but I think you can see from Bob's response that there's no way to solve this rapidly.
    Did you take an image of your Mountain Lion install before upgrading to Yosemite? Roll back to that. If you're not in the habit of taking a snapshot of your system before performing operating system upgrades - get in that habit. If you are dependent on anything at all on hour computer, having a reliable backup method in place is essential. If you don't have a Time Capsule, or some other way to run Time Machine onto a disk that's not in your computer, go set that up yesterday.
    If you can't just remove Yosemite and roll back to Mountain Lion for whatever reason, you can partition your drive so that you can install both Yosemite and Mountain Lion on the same drive, and then boot into Mountain Lion when you need to work in CS5. Or you can take your Mountain Lion disc (I assume you have one, no?) and then use it to create a virtual machine in something like VirtualBox to run Mountain Lion from inside Yosemite.

  • I am using systec usbmodule1 to send and receive CAN messages , is any one have tried this in labview?, if yes can you send me the code thanks

    i am using systec usbmodule1 to send and receive CAN messages , is any one have tried this in labview?, if yes can you send me the code
    thanks
    Solved!
    Go to Solution.

    Hey,
     All of our CAN drivers have been written for National Instruments' CAN hardware (referenced here : http://digital.ni.com/public.nsf/allkb/E2C6ED025C7​98C5586256F4E00520448 ). Thus, you will have to code all your communication manually, unless Systec provides a LabVIEW driver. There might be various dll files that Systec provides for communication, which you will be able to access through LabVIEW. Take a look at the Call Library Function Node, which can be found from the Functions Palette under Connectivity -> Libraries & Executables. Here you can call a dll file, and also the individual functions within that dll.
    I would suggest posting your question either to the LabVIEW forum, as previously mentioned, or to the CAN forum found here : http://forums.ni.com/ni/board?board.id=30
    Justin E
    National Instruments R&D

  • Guys!! any one can help me in recursive permutation of integer array!!

    this is the description of my problem:
    We are supposed to develop a recursive method with the following header:
    public static boolean nextPermutation(int[] array)
    The method receives an integer array parameter which is a permutation of integers 1, 2, �, n. If there is �next� permutation to the permutation represented by the array, then the method returns true and the array is changed so that it represents the �next� permutation. If there is no �next� permutation, the method returns false and does not change the array.
    Here is a verbal description of the recursive algorithm you need to implement:
    1. The first permutation is the permutation represented by the
    sequence (1, 2, �, n).
    2. The last permutation is the permutation represented by the
    sequence (n, �, 2, 1).
    3. If is an arbitrary permutation, then the �next� permutation is
    produced by the following procedure:
    (i) If the maximal element of the array (which is n) is not in the first
    position of the array, say , where , then just swap and . This
    will give you the �next� permutation in this case.
    (ii) If the maximal element of the array is in the first position, so ,
    then to find the �next� permutation to the permutation , first find
    the �next� permutation to , and then add to the end of thus
    obtained array of (n-1) elements.
    (iii) Consecutively applying this algorithm to permutations starting
    from (1, 2, �, n), you will eventually list all possible
    permutations. The last one will be (n, �, 2, 1).
    For example, below is the sequence of permutations for n = 3 , listed by the described algorithm:
    (0 1 2) ; (0 2 1) ; (2 0 1) ; (1 0 2) ; (1 2 0) ; (2 1 0)
    if any one can help me then please help me!! i am stucked at this position to find permutation of the integer array.
    thanks,

    Sure. Why don't you post the code you already have done, and maybe
    someone here can help you with it.

  • I bought a mini DVI to HDMI convertor and  a HDMI to VGA cable to connect my mac book pro to a tv but it doesn't work any one can help.\\\\\

    i bought a mini DVI to HDMI convertor and  a HDMI to VGA cable to connect my mac book pro to a tv but it doesn't work any one can help.

    I would suggest looking into a Thunderbolt to HDMI connector. In this case, you may be able to use the TV as an external monitor. For this option, please confirm through additional research. I have not tested it personally.
    You can also use an Apple TV, which connects with HDMI. In this case, you can use Airplay Mirroring. Not all Macs support Airplay Mirroring, so you need to check first. I have a Mid-2011 27" iMac, and it supports Airplay Mirroring. I don't use it often because my TV is in another room, but I just tried it and it worked. It had to change the screen resolution to work well, so I don't know if I would want to use it as my day to day monitor. http://support.apple.com/kb/ht5404

  • I was just told ML could not be installed because apple HD is broken and could not be repaired. I never had any problem ever to suggest a broken HD, on my 2 yr. old mac pro. 10.6.8. Any one else having this problem? Will I get a refund,  if so how?

    I have a 2009 MAC PRO 10.6.8. Had never had any problems. Tried installing Mountain Lion today. Was told, " Mountain Lion could not be installed because Hard Disk is broken"!
    Is it because HD is broken or perhaps incompatible? Has any one else had this problem? I had no symptoms suggestive of a broken HD. Will I get reimbursed if ML could not be installed? If so what do I have to do?
    How can I verify the status of the HD, in absence of symptoms for my own information?

    mottoo wrote:
    I have a 2009 MAC PRO 10.6.8. Had never had any problems. Tried installing Mountain Lion today. Was told, " Mountain Lion could not be installed because Hard Disk is broken"!
    Is it because HD is broken or perhaps incompatible? Has any one else had this problem? I had no symptoms suggestive of a broken HD. Will I get reimbursed if ML could not be installed? If so what do I have to do?
    How can I verify the status of the HD, in absence of symptoms for my own information?
    The solution to your problem is rather simple
    1: Get a external hard drive and use Disk Utility to format it with a GUID partition map and OS X extended Journaled.
    2: Export your browser bookmarks and any other needed data to a file,. Copy your User data folders of Music, Pictures etc over to the external  drive via drag and drop copy methods, disconnect the drive.
    I don't advise using TimeMachine at this point since your boot drive is messed up, thus so will be your TM drive, just transfering the problem later on back to the new install. We are proceeding with a "Fresh install" method to eliminate as many issues as possible which a TM restore can return to a new OS X install.
    3: Next you will need to follow these instructions to zero erase (important) and install 10.6 fresh, use the same named account (different password ok)
    How to erase and install Snow Leopard 10.6
    4: Before you return files or install programs, Software Update fully and use the AppStore to install 10.8, this way it will be on a fresh 10.6 install, free of issues.
    5: Install any and all 10.8 compatible programs as much as possible before returning your User files, this is a performance measure.
    If you need too, use this site to find one's that are 10.8 compatible.
    http://roaringapps.com/apps:table
    6: Last install your user files from the external drive backup into their respective Music, Pictures, Movies etc., folders, into the same named accounts so you preserve your iTunes playlists. When you open those programs, they will update their respective support files automatically.

  • Does any one can provide documentation model

    Hi
    I am new to this hyperion planning , does any one can provide model of the user requirement documentation (high level business process documentation). Herre the requiremnent is developing a budgeting application with all 3 business statements and emp info in detail manner.
    regards
    M.V

    CaptinSprinklez wrote:
    Yes, do these steps,
    Have you tested this throughly?
    As an example 'lock' Safari via your method.
    Now use Spotlight to search for Safari, tap it - is it 'locked'?
    Now go to your email & find a link to click - Safari opens again.
    Guided access is not a 'lock' in any sense of the word, it is a tool designed to stop things happening, but many apps have multiple ways to be found or launched you can't easily block them all.
    Mallik_Hyderabad, iOS doesn't have this feature & Apple do not seem interested in adding it (7.5 years & it still isn't an option) - use a passcode with a lock screen timeout if you have any sensitive data on the device or get an Android device.

Maybe you are looking for

  • Gmail doesn't work

    my gmail doesn't work on my iPhone

  • Error in Oracle Lite Database connection

    Hi, I have installed the Oracle Application server 10.1.3.1.0 on my laptop (basic installation). I tried to define a database connection in the JDeveloper connection navigator to the Oracle lite database. When I test the connection I got an error: "I

  • What happened to Big Time Moms

    What happened to the latest episode of Big Time Rush? Sunday afternoon it was in the store and when I went to watch it it was the previous episode. When I went back to the store it was no longer available.

  • Service tax Taxinn SD

    Dear Frnds,                      I am unable to find data for setting up service tax in SD.........................I found notes which provided information on TAXINN mm and sd but sd is excluding service tax...........please assist with the condition

  • No songs, but still 1.05 GB used up

    I cleaned off all of the songs on my ipod mini, but it still says 1.05 GB is still being used. I unplugged the ipod, and looked on it and there aren't any songs, but when I replugged it into my computer, it still said 1.05 GB were used.