Quantity& currency fields

hi every one, can any one tell me how to handle/insert quantity& currency fields in  BDC?

Hi
Welcome to SDN forum
You have to pass the Qty and Currency fields as CHAR type fields only
see the sample PO BDC in which these fields are populated using BDC
REPORT zmm_bdcp_purchaseorderkb02
NO STANDARD PAGE HEADING LINE-SIZE 255.
Declaring internal tables *
*-----Declaring line structure
DATA : BEGIN OF it_dummy OCCURS 0,
dummy(255) TYPE c,
END OF it_dummy.
*-----Internal table for line items
DATA : BEGIN OF it_idata OCCURS 0,
ematn(18), "Material Number.
menge(13), "Qyantity.
netpr(11), "Net Price.
werks(4), "Plant.
ebelp(5), "Item Number.
END OF it_idata.
*-----Deep structure for header data and line items
DATA : BEGIN OF it_me21 OCCURS 0,
lifnr(10), "Vendor A/c No.
bsart(4), "A/c Type.
bedat(8), "Date of creation of PO.
ekorg(4), "Purchasing Organisation.
ekgrp(3), "Purchasing Group.
x_data LIKE TABLE OF it_idata,
END OF it_me21.
DATA : x_idata LIKE LINE OF it_idata.
DATA : v_delimit VALUE ','.
DATA : v_indx(3) TYPE n.
DATA : v_fnam(30) TYPE c.
DATA : v_count TYPE n.
DATA : v_ne TYPE i.
DATA : v_ns TYPE i.
*include bdcrecx1.
INCLUDE zmm_incl_purchaseorderkb01.
Search help for file *
AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_file.
CALL FUNCTION 'F4_FILENAME'
EXPORTING
program_name = syst-cprog
dynpro_number = syst-dynnr
IMPORTING
file_name = p_file.
START-OF-SELECTION.
To upload the data into line structure *
CALL FUNCTION 'WS_UPLOAD'
EXPORTING
filename = p_file
filetype = 'DAT'
TABLES
data_tab = it_dummy.
Processing the data from line structure to internal tables *
REFRESH:it_me21.
CLEAR :it_me21.
LOOP AT it_dummy.
IF it_dummy-dummy+0(01) = 'H'.
v_indx = v_indx + 1.
CLEAR it_idata.
REFRESH it_idata.
CLEAR it_me21-x_data.
REFRESH it_me21-x_data.
SHIFT it_dummy.
SPLIT it_dummy AT v_delimit INTO it_me21-lifnr
it_me21-bsart
it_me21-bedat
it_me21-ekorg
it_me21-ekgrp.
APPEND it_me21.
ELSEIF it_dummy-dummy+0(01) = 'L'.
SHIFT it_dummy.
SPLIT it_dummy AT v_delimit INTO it_idata-ematn
it_idata-menge
it_idata-netpr
it_idata-werks
it_idata-ebelp.
APPEND it_idata TO it_me21-x_data.
MODIFY it_me21 INDEX v_indx.
ENDIF.
ENDLOOP.
To open the group *
PERFORM open_group.
To populate the bdcdata table for header data *
LOOP AT it_me21.
v_count = v_count + 1.
REFRESH it_bdcdata.
PERFORM subr_bdc_table USING: 'X' 'SAPMM06E' '0100',
' ' 'BDC_CURSOR' 'EKKO-LIFNR',
' ' 'BDC_OKCODE' '/00',
' ' 'EKKO-LIFNR' it_me21-lifnr,
' ' 'RM06E-BSART' it_me21-bsart,
' ' 'RM06E-BEDAT' it_me21-bedat,
' ' 'EKKO-EKORG' it_me21-ekorg,
' ' 'EKKO-EKGRP' it_me21-ekgrp,
' ' 'RM06E-LPEIN' 'T'.
PERFORM subr_bdc_table USING: 'X' 'SAPMM06E' '0120',
' ' 'BDC_CURSOR' 'RM06E-EBELP',
' ' 'BDC_OKCODE' '/00'.
MOVE 1 TO v_indx.
*-----To populate the bdcdata table for line item data
LOOP AT it_me21-x_data INTO x_idata.
CONCATENATE 'EKPO-EMATN(' v_indx ')' INTO v_fnam.
PERFORM subr_bdc_table USING ' ' v_fnam x_idata-ematn.
CONCATENATE 'EKPO-MENGE(' v_indx ')' INTO v_fnam.
PERFORM subr_bdc_table USING ' ' v_fnam x_idata-menge.
CONCATENATE 'EKPO-NETPR(' v_indx ')' INTO v_fnam.
PERFORM subr_bdc_table USING ' ' v_fnam x_idata-netpr.
CONCATENATE 'EKPO-WERKS(' v_indx ')' INTO v_fnam.
PERFORM subr_bdc_table USING ' ' v_fnam x_idata-werks.
v_indx = v_indx + 1.
PERFORM subr_bdc_table USING: 'X' 'SAPMM06E' '0120',
' ' 'BDC_CURSOR' 'RM06E-EBELP',
' ' 'BDC_OKCODE' '/00'.
ENDLOOP.
PERFORM subr_bdc_table USING: 'X' 'SAPMM06E' '0120',
' ' 'BDC_CURSOR' 'RM06E-EBELP',
' ' 'BDC_OKCODE' '=BU'.
PERFORM bdc_transaction USING 'ME21'.
ENDLOOP.
PERFORM close_group.
End of selection event *
END-OF-SELECTION.
IF session NE 'X'.
*-----To display the successful records
WRITE :/10 text-001. "Sucess records
WRITE :/10 SY-ULINE(20).
SKIP.
IF it_sucess IS INITIAL.
WRITE :/ text-002.
ELSE.
WRITE :/ text-008, "Total number of Succesful records
35 v_ns.
SKIP.
WRITE:/ text-003, "Vendor Number
17 text-004, "Record number
30 text-005. "Message
ENDIF.
LOOP AT it_sucess.
WRITE:/4 it_sucess-lifnr,
17 it_sucess-tabix CENTERED,
30 it_sucess-sucess_rec.
ENDLOOP.
SKIP.
*-----To display the erroneous records
WRITE:/10 text-006. "Error Records
WRITE:/10 SY-ULINE(17).
SKIP.
IF it_error IS INITIAL.
WRITE:/ text-007. "No error records
ELSE.
WRITE:/ text-009, "Total number of erroneous records
35 v_ne.
SKIP.
WRITE:/ text-003, "Vendor Number
17 text-004, "Record number
30 text-005. "Message
ENDIF.
LOOP AT it_error.
WRITE:/4 it_error-lifnr,
17 it_error-tabix CENTERED,
30 it_error-error_rec.
ENDLOOP.
REFRESH it_sucess.
REFRESH it_error.
ENDIF.
CODE IN INCLUDE.
Include ZMM_INCL_PURCHASEORDERKB01
DATA: it_BDCDATA LIKE BDCDATA OCCURS 0 WITH HEADER LINE.
DATA: it_MESSTAB LIKE BDCMSGCOLL OCCURS 0 WITH HEADER LINE.
DATA: E_GROUP_OPENED.
*-----Internal table to store sucess records
DATA:BEGIN OF it_sucess OCCURS 0,
msgtyp(1) TYPE c,
lifnr LIKE ekko-lifnr,
tabix LIKE sy-tabix,
sucess_rec(125),
END OF it_sucess.
DATA: g_mess(125) type c.
*-----Internal table to store error records
DATA:BEGIN OF it_error OCCURS 0,
msgtyp(1) TYPE c,
lifnr LIKE ekko-lifnr,
tabix LIKE sy-tabix,
error_rec(125),
END OF it_error.
Selection screen
SELECTION-SCREEN BEGIN OF LINE.
PARAMETERS session RADIOBUTTON GROUP ctu. "create session
SELECTION-SCREEN COMMENT 3(20) text-s07 FOR FIELD session.
SELECTION-SCREEN POSITION 45.
PARAMETERS ctu RADIOBUTTON GROUP ctu. "call transaction
SELECTION-SCREEN COMMENT 48(20) text-s08 FOR FIELD ctu.
SELECTION-SCREEN END OF LINE.
SELECTION-SCREEN BEGIN OF LINE.
SELECTION-SCREEN COMMENT 3(20) text-s01 FOR FIELD group.
SELECTION-SCREEN POSITION 25.
PARAMETERS group(12). "group name of session
SELECTION-SCREEN COMMENT 48(20) text-s05 FOR FIELD ctumode.
SELECTION-SCREEN POSITION 70.
PARAMETERS ctumode LIKE ctu_params-dismode DEFAULT 'N'.
"A: show all dynpros
"E: show dynpro on error only
"N: do not display dynpro
SELECTION-SCREEN END OF LINE.
SELECTION-SCREEN BEGIN OF LINE.
SELECTION-SCREEN COMMENT 48(20) text-s06 FOR FIELD cupdate.
SELECTION-SCREEN POSITION 70.
PARAMETERS cupdate LIKE ctu_params-updmode DEFAULT 'L'.
SELECTION-SCREEN END OF LINE.
SELECTION-SCREEN BEGIN OF LINE.
SELECTION-SCREEN COMMENT 3(20) text-s03 FOR FIELD keep.
SELECTION-SCREEN POSITION 25.
PARAMETERS: keep AS CHECKBOX. "' ' = delete session if finished
"'X' = keep session if finished
SELECTION-SCREEN COMMENT 48(20) text-s09 FOR FIELD e_group.
SELECTION-SCREEN POSITION 70.
PARAMETERS e_group(12). "group name of error-session
SELECTION-SCREEN END OF LINE.
SELECTION-SCREEN BEGIN OF LINE.
SELECTION-SCREEN COMMENT 51(17) text-s03 FOR FIELD e_keep.
SELECTION-SCREEN POSITION 70.
PARAMETERS: e_keep AS CHECKBOX. "' ' = delete session if finished
"'X' = keep session if finished
SELECTION-SCREEN END OF LINE.
PARAMETERS:p_file LIKE rlgrap-filename.
at selection screen *
AT SELECTION-SCREEN.
group and user must be filled for create session
IF SESSION = 'X' AND
GROUP = SPACE. "OR USER = SPACE.
MESSAGE E613(MS).
ENDIF.
create batchinput session *
FORM OPEN_GROUP.
IF SESSION = 'X'.
SKIP.
WRITE: /(20) 'Create group'(I01), GROUP.
SKIP.
*----open batchinput group
CALL FUNCTION 'BDC_OPEN_GROUP'
EXPORTING
CLIENT = SY-MANDT
GROUP = GROUP
USER = sy-uname.
WRITE:/(30) 'BDC_OPEN_GROUP'(I02),
(12) 'returncode:'(I05),
SY-SUBRC.
ENDIF.
ENDFORM. "OPEN_GROUP
end batchinput session *
FORM CLOSE_GROUP.
IF SESSION = 'X'.
*------close batchinput group
CALL FUNCTION 'BDC_CLOSE_GROUP'.
WRITE: /(30) 'BDC_CLOSE_GROUP'(I04),
(12) 'returncode:'(I05),
SY-SUBRC.
ELSE.
IF E_GROUP_OPENED = 'X'.
CALL FUNCTION 'BDC_CLOSE_GROUP'.
WRITE: /.
WRITE: /(30) 'Fehlermappe wurde erzeugt'(I06).
ENDIF.
ENDIF.
ENDFORM. "CLOSE_GROUP
Start new transaction according to parameters *
FORM BDC_TRANSACTION USING TCODE TYPE ANY.
DATA: L_SUBRC LIKE SY-SUBRC.
*------batch input session
IF SESSION = 'X'.
CALL FUNCTION 'BDC_INSERT'
EXPORTING
TCODE = TCODE
TABLES
DYNPROTAB = it_BDCDATA.
WRITE: / 'BDC_INSERT'(I03),
TCODE,
'returncode:'(I05),
SY-SUBRC,
'RECORD:',
SY-INDEX.
ELSE.
REFRESH it_MESSTAB.
CALL TRANSACTION TCODE USING it_BDCDATA
MODE CTUMODE
UPDATE CUPDATE
MESSAGES INTO it_MESSTAB.
L_SUBRC = SY-SUBRC.
WRITE: / 'CALL_TRANSACTION',
TCODE,
'returncode:'(I05),
L_SUBRC,
'RECORD:',
SY-INDEX.
ENDIF.
Message handling for Call Transaction *
perform subr_mess_hand using g_mess.
*-----Erzeugen fehlermappe
IF L_SUBRC <> 0 AND E_GROUP <> SPACE.
IF E_GROUP_OPENED = ' '.
CALL FUNCTION 'BDC_OPEN_GROUP'
EXPORTING
CLIENT = SY-MANDT
GROUP = E_GROUP
USER = sy-uname
KEEP = E_KEEP.
E_GROUP_OPENED = 'X'.
ENDIF.
CALL FUNCTION 'BDC_INSERT'
EXPORTING
TCODE = TCODE
TABLES
DYNPROTAB = it_BDCDATA.
ENDIF.
REFRESH it_BDCDATA.
ENDFORM. "BDC_TRANSACTION
Form subr_bdc_table *
text
-->P_0220 text *
-->P_0221 text *
-->P_0222 text *
FORM subr_bdc_table USING VALUE(P_0220) TYPE ANY
VALUE(P_0221) TYPE ANY
VALUE(P_0222) TYPE ANY.
CLEAR it_bdcdata.
IF P_0220 = ' '.
CLEAR it_bdcdata.
it_bdcdata-fnam = P_0221.
it_bdcdata-fval = P_0222.
APPEND it_bdcdata.
ELSE.
it_bdcdata-dynbegin = P_0220.
it_bdcdata-program = P_0221.
it_bdcdata-dynpro = P_0222.
APPEND it_bdcdata.
ENDIF.
ENDFORM. " subr_bdc_table
Form subr_mess_hand *
text *
-->P_G_MESS text *
FORM subr_mess_hand USING P_G_MESS TYPE ANY.
LOOP AT IT_MESSTAB.
CALL FUNCTION 'FORMAT_MESSAGE'
EXPORTING
ID = it_messtab-msgid
LANG = it_messtab-msgspra
NO = it_messtab-msgnr
v1 = it_messtab-msgv1
v2 = it_messtab-msgv2
IMPORTING
MSG = P_G_MESS
EXCEPTIONS
OTHERS = 0.
CASE it_messtab-msgtyp.
when 'E'.
it_error-error_rec = P_G_MESS.
it_error-lifnr = it_me21-lifnr.
it_error-tabix = v_count.
APPEND IT_ERROR.
when 'S'.
it_sucess-sucess_rec = P_G_MESS.
it_sucess-lifnr = it_me21-lifnr.
it_sucess-tabix = v_count.
APPEND IT_SUCESS.
endcase.
ENDLOOP.
Describe table it_sucess lines v_ns.
Describe table it_error lines v_ne.
ENDFORM. " subr_mess_hand
Regards
ANJI

Similar Messages

  • Smart Form - Right Aligning of Quantity & Currency Fields

    Hi,
    I have a paragraph set with left aligned. But the Decimals Fields (Quantity & Currency) are to be made Right Aligned. I am using &Structure-Field(R)& to force the respective fields right aligned. But this is not working. I am not sure, what is that I am missing to look into. Can you please suggest me a suitable method to make it work?
    Thanks,
    Kannan

    Kannan,
    I had faced a similar problem and got it rectified by delcaring a paragraph format which is right aligned.
    go to smartstyles.
    create a paragraph format R and click on the INDENTS AND SPACING tab wherein set the alignment as RIGHT-ALIGNED.
    Now come to the smartform
    open the respecitve smartform.
    click on the  text for Quantity and Currency and in the respective windows click on OUTPUT OPTIONS tab and mention the style name ( the style which you have used in smartstyles).
    Come to the General Attributes and give the same Paragraph format  in the Text editor.
    This should solve the problem.If any doubt reverut it.
    Reward points if found helpful.
    K.Kiran.

  • Urgent : Problem with Editable  ALV Grid  for Quantity and Currency Fields

    Hi All,
    I am using Editable ALV Grid display and have quantity and value as editable fields in the display.
    When user changes these values these values are not changing properly .
    For the quantity field the domain is MENG13 with 3 deciamal places and here  if we enter 500 it takes it as 0.500   .
    The same problem is for the currency field. Here the Domain is WERT7 with 3 decimal places.
    Here also it takes last 2 digits after decimal places by default.
    Please advice how to get proper values in this case from ALV editable fields.
    Thanks and Regards
    Harshad
    Edited by: Harshad Rahirkar on Dec 25, 2007 7:39 AM

    for all the currency field , it will display like that only.
    u have to manipulate uin program before displaying.
    if they are giving 500, in program multiply with 100 and move it to table.
    when u are getting from table, divinde and display.
    this is what I am doing.
    Reward if helpfull.

  • How to delete zeros in layout for quantity and currency fields

    Hi All
    Iam getting zeros in place of quantity and currency field records, which i doesnt require in layout SAP-Script.
    Please let me know if any one has an idea.
    Regards
    Bhaskar

    Hi,
    Add NO-ZEROES statement to it.
    or
    U can use CONDENSE statement.
    Cheers,
    SImha.

  • Reference field for quantity/currency

    why s that we need to give a reference field for quantity and currency based fields alone

    hi,
    The reference field is used for the output, the output/input format of a currency field depends on the value of its reference field.
    For example if you create a screen using the field KONV-KBETR :
    the reference field is RV61A-AWEI1:
    if you set RV61A-AWEI1 = 3
    the value in KONV-KBETR is beeing shown with 3 decimals
    So you could see 3,000 but this value is automatically stored as 30.00
    if you set RV61A-AWEI1 = 2
    the value in KONV-KBETR is beeing shown with 2 decimals
    All this convertions are automatically made in according to the value setted in reference field.
    You can see this using the statament WRITE with options CURRENCY, try this:
    PARAMETERS P_KBETR LIKE KONV-KBETR.
    WRITE: P_KBETR CURRENCY '3'.
    WRITE: / P_KBETR CURRENCY '2'.
    WRITE: / P_KBETR CURRENCY '1'.
    Rgds
    Anver

  • Currency Field in Smart Form

    Hi,
    How to Display Currency Field in SmartForm  and how to declare

    You can display a field in GLOBAL data of TYPE I (v_menge).
    then in the related window of that Quantity field create PROGRAM LINES and in that write a small code such that
    MOVE ITAB-MENGE to v_menge.
    Now display this field v_menge in the smartform
    Regards
    Anbu B

  • Problem in selecting object currency fields from table COSP and COSS

    Dear All,
    We are facing a issue while creating a virtual DataSource   for CCA plan from tables COSS and COSP.
    The issue is that we are able to activate the view by including the fields value in object currency ( WOG001 - WOG012 ) but not able  to create a DataSource   on the view.
    We are able to include the transaction currency value but as our application requires us to include the object currency fields.
    Error displayed:Invalid extract structure template .This operation failed, because the template structure quantity fields or currency fields, for example, field WOG001 refer to a different table.
    Any tips to resolve this issue would be valuable.
    Thanks in advance
    Rashmi Nair.

    HI,
    Can you see this thread.
    Re: How to display BAPI decimal values into webdynpro!
    Thanks
    nageswar

  • Currency field in Generic Data Source

    Hi All,
    I have a case here, where i have few Amount field in my Generic Extractor which is based on a table ZXXX.
    Now the key figures have 0currency appended in theie currency tab which is coming from table ZYYY, now while saving the data source is giving error that the extract structure is not proper, reason being the base table has no currency field and the kf's need to have one currency field to assign to it which is coming from some other table.
    One sloution is create an FM based extractor, but we dont want that.
    Can any one suggest any work around without any FM or View??
    Thanks,
    Neha.

    if your table have currency field with different reference table and field mean
    you have to create view
    Diagnosis
    You tried to generate an extract structure with the template structure eg:XXXX(table). This operation failed, because the template structure quantity fields or currency fields, for example, field XXXX(fileld) refer to a different table.
    Procedure
    Use the template structure to create a view or DDIC structure that does not contain the inadmissable fields.
    1.Create the view
    2.Add the currency field and currecy key field also
    3.Create the generic data source in RSO2
    Regards,
    G

  • Customer exits for currency field in generic extractor

    Hi,
    I had a requirement to create a generic extractor. I've created a generic extractor by name 'ZXXZ_XXX_TAX_ATTR'. This extractor was created based on a table T007V in turn view. It has a currency and a quantity type field. Those two fields were not refering to a table fields but were refering a structure. So as per the note 335342, if we have fields of curr/quan type and are having reference fields as a structure field, we need to populate those fields throught a customer exit.
    As I have read that the same problem has been solved by you with customer exit. So can you mail me the exit code as I am not a good in  ABAP.
    Regards,
    Amol Gaurkar

    Hi Amol,
    Here is the code below,
    TYPES: BEGIN OF TY_T007V,
                     TRKORR TYPE TRKORR,
                     ALAND  TYPE ALAND,
                     MWSKZ TYPE MWSKZ,
                     TXJCD  TYPE TXJCD,
                     DATAM  TYPE DATAM,
                     KSCHL  TYPE KSCHL,
                     KBETR  TYPE KBETR,
                  END OF TY_T007V.
    DATA:  T_T007V TYPE STANDARD TABLE OF TY_T007V,
                T_EXTRSTRU TYPE STANDARD TABLE OF <b><Extract Structure></b>,
    **--    Work Area
               W_T007V TYPE TY_T007V,
               L_TABIX   TYPE SY-TABIX.
    CASE I_DATASOURCE.
       WHEN 'ZXXZ_XXX_TAX_ATTR'.
         REFRESH: T_T007V.
         CLEAR:     W_T007V,
                          L_TABIX.
         T_EXTRSTRU[] = C_T_DATA[].
         IF NOT T_EXTRSTRU IS INITIAL.
    Fetching all the records into internal table T_T007V from the transparent table T007V
           SELECT TRKORR
                         ALAND
                         MWSKZ
                         TXJCD
                         DATAM
                         KSCHL
                         KBETR
               INTO TABLE T_T007V
               FROM T007V
                FOR ALL ENTRIES IN T_EXTRSTRU
              WHERE TRKORR = T_EXTRSTRU-KOKRS
                AND ALAND = T_EXTRSTRU-ALAND
                AND MWSKZ = T_EXTRSTRU-MWSKZ
                AND TXJCD  = T_EXTRSTRU-TXJCD
                AND DATAM = T_EXTRSTRU-DATAM
                AND KSCHL = T_EXTRSTRU-KSCHL.
           IF NOT T_T007V IS INITIAL.
             SORT T_T007V BY TRKORR ALAND MWSKZ TXJCD DATAM KSCHL.
             LOOP AT T_EXTRSTRU INTO W_EXTRSTRU.
               L_TABIX = SY-TABIX.
               READ TABLE T_T007V INTO W_T007V
                                 WITH KEY TRKORR = T_EXTRSTRU-KOKRS
                                                  ALAND   = T_EXTRSTRU-ALAND
                                                  MWSKZ  = T_EXTRSTRU-MWSKZ
                                                  TXJCD    = T_EXTRSTRU-TXJCD
                                                  DATAM   = T_EXTRSTRU-DATAM
                                                  KSCHL   = T_EXTRSTRU-KSCHL
                                 BINARY SEARCH.
               IF SY-SUBRC = 0.
                 W_EXTRSTRU-KBETR = W_T007V-KBETR.
                 MODIFY T_EXTRSTRU FROM W_EXTRSTRU INDEX L_TABIX.
                 CLEAR W_EXTRSTRU.
               ENDIF.
               CLEAR: W_T007V,
                      L_TABIX,
                      W_EXTRSTRU.
             ENDLOOP.
           ENDIF.
           REFRESH C_T_DATA.
           C_T_DATA[] = T_EXTRSTRU[].
           REFRESH: T_T007V,
                    T_EXTRSTRU.
         ENDIF.
    ENDCASE.                           "ENDCASE FOR RETREVING THE EXTRACTOR
    <b>Reward points if this helps,</b>
    Kiran

  • Currency field in Purchase requisition

    Hi
    I need currency in PR to be changed if I have to raise a request in USD where as my Com code currency is INR
    I understand that the currency field is defaulted from Company code through Plant entered in the PR. And also there is no field for currency in SPRO for "Define screen layout at Document level".
    Please tell me how do I achieve this
    Thanks
    MRao

    check what is ur field reference key for PR (NBB is the standard one).then in "Define screen layout at Document level" choose the same field reference key and double click on Quantity and price.here make Price and price unit as required or optional entry.
    regards,
    indranil

  • Error in smart form with currency  fields

    while i am using with currency fields in samrt forms error is comming in while i am giving print-preview in se38 "<b>Reference field WA_EKPO-NETPR unknown in form."</b>

    In smart forms if we want to display quantity and currency fields. We cannott directly display currency field and quantity fields.
    To display the mdo like this
    Ex: GLOBAL Definitions
    WA_NETPR LIKE EKPO-NETPR
    For that we have to create an extra variable in global definitions
    Ex: netpr FIELD of EKPO
    CREATE program lines and specify WA_NETWR = itab-netpr.
    Close the thread once your question is answered.
    Regards,
    SaiRam

  • Missing Currency Field/ Unit  Field.

    Hi Experts,
    I'm trying to load Master data in to an InfoObject, And the master data contains 5 char and 3 keyfigures.
    I have created 2 KFs as Amount and have mentioned data type as currency field and Fixed currency as INR
    and the other KF as Quantity and Fixed Unit of Measure as EA.
    And my Flat file contains column 8.Quantity, 9.UnitOfMeasure, 10.UnitPrice, 11.TotalValue.
    While I try to activated the Datasource I'm getting an Error as (Position 8) Missing Currency Field/ Unit  Field.
    Can anyone tell me what has gone wrong with it please.
    Thanks

    Check have you assigned the fileds from your flat file for Unit and Current to the Data Types in UNIT and CUKY.
    Cheers,
    Neel.

  • Smartform-currency field error.

    Hi folks,
      In My smartform i want to print the net value from vbrp table ( netpr) .but when iam executing the form it is throwing error as " reference field netpr " is unknown in form..
    where i have to declare reference field of netpr.
    Thanks,
    Neelima.N

    hi ,
      use the following documentation for your help.
    Displaying Fields That Refer to Currencies or Quantities
    Use
    In the ABAP Dictionary, you can assign a currency or quantity field to a table field if the table field contains a currency or quantity value. When printing these fields, SAP Smart Forms can take into account the assigned currency or unit:
    If the value field is in the same table as the assigned currency or quantity field, SAP Smart Forms automatically recognizes this and, during output, formats the value field according to the currency or unit in the assigned field.
    If the value field and the assigned currency or quantity field are stored in different tables, SAP Smart Forms cannot automatically recognize the relationship.
    In the second case, you must inform SAP Smart Forms about the relationship.
    Procedure
    As mentioned above, you only have to perform the following steps if a value field that is to be displayed in a table (for example, VALTAB) has a relationship to a currency or quantity field in another table (for example, CURTAB). In this case, you have to specify the relationship explicitly:
    In the form, define a global field of the same type as the table in which the currency or quantity field is stored, for example WA_CURTAB. Also define a work area for the output of your value field, for example WA_VALTAB.
    If you use a table with a header line, you do not need to define a work area. Instead, you work through the following steps with the header line of the relevant table. In the following step, for example, you would specify the field VALTAB-VALUE instead of WA_VALTAB-VALUE under Field Name.
    Create the relationship to the currency field by switching to the Currency/Quantity fields of the Global Definitions node and entering the following values:
    Field name: WA_VALTAB-VALUE if this is the value field of VALTAB that is to be output
    Reference field: WA_CURTAB-CURRENCY, therefore the currency field of CURTAB
    Use the work area WA_VALTAB on the data tab page of your table node or loop node.
    Create a program lines node before the event at which the value field is printed.
    In the program lines node, assign the currency or unit in which you want to format the value field WA_VALTAB-VALUE to the currency or quantity field of the global field WA_CURTAB-CURRENCY. You have to either select the value of WA_CURTAB-CURRENCY afterwards or have already passed it to the form interface.
    Display or print the value field WA_VALTAB-VALUE.
    Result
    During output, SAP Smart Forms formats the value field WA_VALTAB-VALUE according to the value assigned to the currency or quantity field of the global variable WA_CURTAB_CURRENCY.
    regards,
    Veeresh

  • How can I find the currency field of table KOMU

    I need to select data from table KOMU, including field wrbtr. in 'Currency/Quantity Fields' tab, it's defined to use bkpf-waers.
    but how can i find the corresponding record in bkpf? could anyone tell me the relation between these two table?
    or is there another way to get the currency field?
    thank you!

    Hi,
    In that case, please retrieve the currency & store it in variable. Pass the variables to the Function Module.
    CALL FUNCTION 'CONVERT_TO_LOCAL_CURRENCY'
         EXPORTING
              date             = syst-datum
              foreign_amount   = for_amount
              foreign_currency = L_cur1
              local_currency   =  l_cur2
         IMPORTING
              local_amount     = loc_ammount
         EXCEPTIONS
              no_rate_found    = 1
              overflow         = 2
              no_factors_found = 3
              no_spread_found  = 4
              derived_2_times  = 5.
    [Code]
    Best regards,
    Prashant
    [code]

  • BDC Currency field Recording

    Hi,
         How we can do mapping for the Currency fields in bdc recording. is there any special approach or like normal fields only. Can any body clear it.
    Thanks......

    Hi Anil,
    <b>For example, while recording you met with fields --> MSEG-DMBTR (Currency field)
    Go to SE11 --> MSEG --> Search for DMBTR --> Double click on the Data Element i.e. DMBTR --> Double Click on the domain WERTZ --> You can see under the block Output Characteristics : Output Length = 16.
    While declaring the TYPES Structure, make it CHAR(16).</b>
    <b>The same way u search for u r currency field and declare the length of the field equal to output length of type char</b>
    Same u have to follow for quantity fields .

Maybe you are looking for