Associate Print Parameters with Program Variant

Is there any standard way to associate a particular set of print parameters with a program variant?

i think it is possible ? try to make use of
<b>
Selection Variables
    The following three types of selection variables are currently
    supported:
    o   Table variables from TVARVC
        You should use these variables if you want to store static
        information. TVARVC variables are proposed by default.
    o   Dynamic date calculations:
        To use these variables, the corresponding selection field must have
        type 'D' (date). If the system has to convert from type T to type D
        when you select the selection variables, the VARIABLE NAME field is
        no longer ready for input. Instead, you can only set values using
        the input help.
        The system currently supports the following dynamic date
        calculations:
        Today's date
         From beginning of the month to today
         Today's date +/- x days
         First quarter ????
         Second quarter ????
         Third quarter ????
         Fourth quarter ????
         Today's date - xxx, today's date + yyy
         Previous month
     o   User-specific variables
         Prerequisite: The selection field must have been defined in the
         program using the MEMORY ID pid addition. User-specific values,
         which can be created either from the selection screen or from the
         user maintenance transaction, are placed in the corresponding
         selection fields when the user runs the program.
     The SELECTION OPTIONS button is only supported for date variables that
     fill select-options fields with single values.
</b>
but thing is u have to maintain para/selection options for ur report.
Regards
Prabhu

Similar Messages

  • Problem Exporting / Importing print forms with program RSTXSCRP

    Hi!
    there is problem Exporting / Importing print forms with program RSTXSCRP.
    when I transfer print form from one SAP system to other, logo image and some text is missing... what could be the reason?
    Maybe there is other way to transfer print forms between SAP systems without using program RSTXSCRP?
    Will reward,
    Mindaugas

    Hi,
    when you transfer print forms from one sap system to another, logos are not transfered automatically. these are actually .bmp files which need to be existing in every client. then only when you run your print program logo can be seen in your print output. hence logos need to be created explicitly in every client where you want to run your print program.
    thanks,
    sksingh

  • Newbie question: Send data to printer from ABAP program

    Hello, I am a newbie.
    I do not use  SAPScript nor SmartForms.
    But I need to send a printer command stream from my ABAP to printer.
    Is it possible?
    How can this be possible? Please give me some guideline.
    I will reward you points. Promise.
    Thanks

    hi,
    u can send ur program details to printer using submit to sap-spool statement.
    SUBMIT TO SAP-SPOOL
    Basic form
    SUBMIT rep ... TO SAP-SPOOL.
    Extras:
    1.... DESTINATION dest         ... COPIES cop
            ... LIST NAME name
            ... LIST DATASET dsn
            ... COVER TEXT text
            ... LIST AUTHORITY auth
            ... IMMEDIATELY flag
            ... KEEP IN SPOOL flag
            ... NEW LIST IDENTIFICATION flag
            ... DATASET EXPIRATION days
            ... LINE-COUNT lin
            ... LINE-SIZE  col
            ... LAYOUT layout
            ... SAP COVER PAGE mode
            ... COVER PAGE flag
            ... RECEIVER rec
            ... DEPARTMENT dep
            ... ARCHIVE MODE armode
            ... ARCHIVE PARAMETERS arparams
            ... WITHOUT SPOOL DYNPRO
    2. ... SPOOL PARAMETERS params
             ... ARCHIVE PARAMETERS arparams
             ... WITHOUT SPOOL DYNPRO
    3. ... Further parameters (for passing variants)
            are described in the documentation for SUBMIT
    The syntax check performed in an ABAP Objects context is stricter than in other ABAP areas. See Missing print parameters with SUBMIT.
    Effect
    Calls the report rep with list output to the SAP spool database.
    Additions
    ... DESTINATION dest(output device)
    ... COPIES cop(number of copies)
    ... LIST NAME name(name of list)
    ... LIST DATASET dsn(name of spool dataset)
    ... COVER TEXT text(title of spool request)
    ... LIST AUTHORITY auth(authorization for display)
    ... IMMEDIATELY flag(print immediately ?)
    ... KEEP IN SPOOL flag(keep list after print ?)
    ... NEW LIST IDENTIFICATION flag(new spool request ?)
    ... DATASET EXPIRATION days(number of days list
    retained)
    ... LINE-COUNT lin ( lin lines per page)
    ... LINE-SIZE  col(col columns per line)
    ... LAYOUT layout(print format)
    ... SAP COVER PAGE mode(SAP cover sheet ?)
    ... COVER PAGE flag(selection cover sheet ?)
    ... RECEIVER rec(SAP user name of
    recipient)
    ... DEPARTMENT dep(name of department)
    ... ARCHIVE MODE armode(archiving mode)
    ... ARCHIVE PARAMETERS arparams(structure with archiving
    parameters)
    ... WITHOUT SPOOL DYNPRO(skip print control screen)
    With the parameters IMMEDIATELY, KEEP IN SPOOL, NEW LIST IDENTIFICATION and COVER TEXT, flag must be a literal or character field with the length 1. If flag is blank, the parameter is switched off, but any other character switches the parameter on. You can also omit any of the sub-options of PRINT ON. mode with SAP COVER PAGE can accept the values ' ', 'X' and 'D'. These values have the following meaning:
    ' ' : Do not output cover sheet
    'X' : Output cover sheet
    'D' : Cover sheet output according to printer setting
    armode with ARCHIVE MODE can accept the values '1', '2' and '3'. These values have the following meaning:
    '1' : Print only
    '2' : Archive only
    '3' : Print and archive
    arparams with ARCHIVE PARAMETERS must have the same structure as ARC_PARAMS. This parameter should only be processed with the function module GET_PRINT_PARAMETERS.
    Effect
    Output is to the SAP spool database with the specified parameters. If you omit one of the parameters, the system uses a default value. Before output to the spool, you normally see a screen where you can enter and/or modify the spool parameters. However, you can suppress this screen with the following statement:
    ... TO SAP-SPOOL WITHOUT SPOOL DYNPRO
    You could use this option if all the spool parameters have already been set!
    Note
    When specifying the LINE-SIZE, you should not give any value > 132 because most printers cannot print wider lists.
    Addition 2
    ... SPOOL PARAMETERS params(structure with print
    parameters)
    ... ARCHIVE PARAMETERS arparams(Structure with archive
    parameters)
    ... WITHOUT SPOOL DYNPRO(skip print parameters
    screen)
    Effect
    Output is to the SAP spool database with the specified parameters. The print parameters are passed by the field string params which must have the structure of PRI_PARAMS. The field string can be filled and modified with the function module GET_PRINT_PARAMETERS. The specification arparams with ARCHIVE PARAMETERS must have the structure of ARC_PARAMS. This parameter should only be processed with the function module GET_PRINT_PARAMETERS. Before output to the spool, you normally see a screen where you can enter and/or modify the spool parameters. However, you can suppress this screen with the following statement:
    ... WITHOUT SPOOL DYNPRO
    Example
    Without archiving
    DATA: PARAMS LIKE PRI_PARAMS,
          DAYS(1)  TYPE N VALUE 2,
          COUNT(3) TYPE N VALUE 1,
          VALID    TYPE C.
    CALL FUNCTION 'GET_PRINT_PARAMETERS'
      EXPORTING DESTINATION           = 'LT50'
                COPIES                = COUNT
                LIST_NAME             = 'TEST'
                LIST_TEXT             = 'SUBMIT ... TO SAP-SPOOL'
                IMMEDIATELY           = 'X'
                RELEASE               = 'X'
                NEW_LIST_ID           = 'X'
                EXPIRATION            = DAYS
                LINE_SIZE             = 79
                LINE_COUNT            = 23
                LAYOUT                = 'X_PAPER'
                SAP_COVER_PAGE        = 'X'
                COVER_PAGE            = 'X'
                RECEIVER              = 'SAP*'
                DEPARTMENT            = 'System'
                NO_DIALOG             = ' '
      IMPORTING OUT_PARAMETERS        = PARAMS
                VALID                 = VALID.
    IF VALID <> SPACE.
      SUBMIT RSTEST00 TO SAP-SPOOL
        SPOOL PARAMETERS PARAMS
        WITHOUT SPOOL DYNPRO.
    ENDIF.
    Example
    With archiving
    DATA: PARAMS   LIKE PRI_PARAMS,
          ARPARAMS LIKE ARC_PARAMS,
          DAYS(1)  TYPE N VALUE 2,
          COUNT(3) TYPE N VALUE 1,
          VALID    TYPE C.
    CALL FUNCTION 'GET_PRINT_PARAMETERS'
      EXPORTING DESTINATION            = 'LT50'
                COPIES                 = COUNT
                LIST_NAME              = 'TEST'
                LIST_TEXT              = 'SUBMIT ... TO SAP-SPOOL'
                IMMEDIATELY            = 'X'
                RELEASE                = 'X'
                NEW_LIST_ID            = 'X'
                EXPIRATION             = DAYS
                LINE_SIZE              = 79
                LINE_COUNT             = 23
                LAYOUT                 = 'X_PAPER'
                SAP_COVER_PAGE         = 'X'
                COVER_PAGE             = 'X'
                RECEIVER               = 'SAP*'
                DEPARTMENT             = 'System'
                SAP_OBJECT             = 'RS'
                AR_OBJECT              = 'TEST'
                ARCHIVE_ID             = 'XX'
                ARCHIVE_INFO           = 'III'
                ARCHIVE_TEXT           = 'Description'
                NO_DIALOG              = ' '
      IMPORTING OUT_PARAMETERS         = PARAMS
                OUT_ARCHIVE_PARAMETERS = ARPARAMS
                VALID                  = VALID.
    IF VALID <> SPACE.
      SUBMIT RSTEST00 TO SAP-SPOOL
        SPOOL PARAMETERS PARAMS
        ARCHIVE PARAMETERS ARPARAMS
        WITHOUT SPOOL DYNPRO.
    ENDIF.

  • RSPC Variant does not exist - Could not find or load print parameters

    We are on BI 7.0 (support pack SAPKW70017).  We recently freshed test system from production.   After the refresh, we have problems opening all the process chains.  
    1. When I go to RSPC to open a process chain, I get many messages like this:
    Variant &0000000067180 does not exist (there are different variant numbers)
    Message no. DB612
    Diagnosis
    You selected variant &0000000067180 for program RSPROCESS.
    This variant does not exist.
    2. When I go to SM21 to check the system log, it displays many entries like below:
    EJ  F Could not find or load print parameters for step 1, job BI_PROCESS_TRIGGER/09134500
    Documentation for system log message EJ F :                                                                               
    An error occurred during loading of the print parameters for a        
    background job step.                                                  
    The print parameter record may have been deleted even though there was
    a still a step that needed that data. This is an error as the         
    reorganization of the print parameters should prevent this from       
    happening.                                                            
    To fix the problem, edit the step and save it, copy the job, or       
    schedule a new job. The print parameters will be regenerated in all   
    these cases.    
    3. I applied the OSS note 1169659 - Correction: Process variants not entered by BDLS.   The Basis rerun BDLS.  But it did not fix the problem.
    Would appreciate if someone could provide any help.
    Thank you.

    Hi Rebecca.
    1) Please verify if exist process types called 'unknown job'. If exist:  delete process types called 'unknown job' in your process chain. To do that please remove the chain from scheduling (menu bar > process chain > remove from schedule), afterwards switch the detail view on (menu bar >  view) > right mouse click on the process type "unknown job" > displaying scheduled jobs > delete that job. After deletion of the 'unknown jobs' activate and schedule your process chain again.
    2) After the removal of the 'unknown jobs' please check if the error messages with the missing variants pop up when calling your process chain disappears. If not, please implement and execute the attached report Z_FIND_JOBS_WITHOUT_VARIANT which deletes the jobs without variants.
    I have already attached report as Report Z_FIND_JOBS_WITHOUT_VARIANT, you can download and create the report accordingly.
    = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = =
    REPORT  Z_FIND_JOBS_WITHOUT_VARIANT.
    data: l_t_job type table of tbtcp with header line,
          l_s_varsel    TYPE rsvar,
          l_t_variant   TYPE TABLE OF rsparams.
    parameters: delete type rs_bool.
    select * from tbtcp as job into table l_t_job
                        where progname = 'RSPROCESS'
                        and   exists ( select * from tbtco
                              where jobname = job~jobname
                              and   jobcount = job~jobcount
                              and   status = 'S' ).
    loop at l_t_job.
      l_s_varsel-report  = l_t_job-progname.
      l_s_varsel-variant = l_t_job-variant.
      CALL FUNCTION 'RS_VARIANT_CONTENTS'
        EXPORTING
          report               = l_s_varsel-report
          variant              = l_s_varsel-variant
          execute_direct       = 'X'
        TABLES
          valutab              = l_t_variant
        EXCEPTIONS
          variant_non_existent = 1
          variant_obsolete     = 2
          OTHERS               = 3.
      if sy-subrc <> 0.
        write: / l_t_job-jobname, l_t_job-jobcount.
        if delete = 'X'.
          CALL FUNCTION 'BP_JOB_DELETE'
            EXPORTING
              JOBCOUNT = l_t_job-jobcount
              JOBNAME  = l_t_job-jobname
            EXCEPTIONS
              OTHERS   = 1.
          IF SY-SUBRC <> 0.
            write 'not deleted'.
          else.
            write 'successfully deleted'.
          ENDIF.
        endif.
      endif.
    endloop.
    = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = = =
    I hope I can be helpful.
    Thanks,
    Walter Oliveira.

  • Creation of new Print Program & Variant for new Correspondence Type created

    Dear Friends,
    I have created 2 new Correspondence Types in SAP as SAP61 (Vendor Debit Note) & SAP62 (Vendor Credit Note) by copying SAP09 (Internal Document) properties like itu2019s Name of the print program - RFKORD30 & Name of variant - SAP09.
    We are facing problem when we execute print program in F.64 for SAP09 it is coming same like SAP61 or SAP62. Actual script & print values of SAP09 are replaced by SAP61 or SAP62.
    Please suggest us how we can differentiate both SAP09 & SAP61/62. Because we use these correspondences for different purposes like SAP09 gives the information for the Line items in the Document whereas SAP61/62 gives the information of vendor line item weather it is debit or credit entry.
    Your kind co-operation in this matter is highly appreciated.
    Thanks & Regards,
    Naveen Kumar.P

    "Assigned the from to the company code - progam in V_001F_B"
    Check 'Form ID' field in this IMG transaction against the program and form that you have created.
    I am assuming there are 2 lines with same entries but different form IDs.
    Or there are 2 lines with the same entries but different CoCodes (seem to remember that the CoCode is not taken into account as a key in certain programs - not logical i know but remembered a previous issue I had many moons ago - could be to do with the blank entry for CoCode field if there is one being picked up by the program before the entry that has your CoCode).
    Now check the variant attached and Form ID in step 'Created new program variants in SA38'
    Ensure the correct program and variant are attached in step OB78.
    My assumption is Form ID is the key.
    Hope this helps

  • Our software vendor tells to use FF 3.5.1. because of some printer issues with their web based program. How safe is it to work with FF 3.5.1 in 2012?

    Our software vendor tells to use FF 3.5.1. because of some printer issues with their web based program. How safe is it to work with FF 3.5.1 in 2012?

    Thanks for the reply. I'll have a look at your solution.

  • Need to submit a program with a variant

    Hi all,
    This is my code i need to submit RSIRCCON program to this program with a variant . I have created a variant with a name "VARIANT1" . After excuting this program am getting an error message "VARIANT VARIANT1 does not exist " .
    Can any one help me to resolve this issue .
      Z_RSIRCCON_2                                                *
    REPORT  Z_RSIRCCON_2  NO STANDARD PAGE HEADING
                                       LINE-SIZE  255
    TABLES                                                              *
                                       LINE-COUNT 65.
    TABLES: somlreci1.
    *Global Variables                                                      *
    DATA: repository(255) TYPE C,
          L_PROGRAMM LIKE RS38M-PROGRAMM,
          variant1 like RS38M-SELSET.
    l_programm = 'Z_RSIRCCON_2'.
    variant1   = 'VARIANT1'.
    SELECTION SCREEN                                                    *
    SELECTION-SCREEN BEGIN OF BLOCK b1  WITH FRAME TITLE text-001.
    SELECT-OPTIONS: p_repos FOR repository.
    PARAMETER:p_single AS CHECKBOX USER-COMMAND run,
              p_multi AS CHECKBOX USER-COMMAND run,
              p_run AS CHECKBOX USER-COMMAND run.
    SELECTION-SCREEN END OF BLOCK  b1.
    SELECTION-SCREEN BEGIN OF BLOCK a1 WITH FRAME TITLE text-043.
    PARAMETER :p_esub TYPE repository.
    SELECT-OPTIONS:p_email  FOR somlreci1-receiver MODIF ID sc6 .
    SELECTION-SCREEN END OF BLOCK  a1.
    START-OF-SELECTION                                                  *
    CALL FUNCTION 'RS_PROGRAM_POPUP_VARIANT'
      EXPORTING
        progname               = l_programm
        VARIANT                = VARIANT1
      DEBG                   = ' '
      MESSAGE_ON_POPUP       = ' '
    IMPORTING
      OK_CODE                =
      NEW_VARIANT            =
    EXCEPTIONS
      NO_VARIANT             = 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.
    submit RSIRCCON VIA SELECTION-SCREEN using SELECTION-SET 'VARIANT1' AND RETURN.
    null

    Hi,
    You cannot user the variant of 'Program 1' to call the 'Program 2'.
    When you write the statement
    SUBMIT RSIRCCON VIA SELECTION-SCREEN USING SELECTION-SET 'VARIANT1' AND RETURN.
    it means that you are trying to submit the program RSIRCCON with the selection screen variant 'VARIANT1'. SAP expect this variant to be of program RSIRCCON not your calling 'Z' program. Since program RSIRCCON does not have any selection-screen, you can not create a variant and thus you cannot submit it with selection-set variant.
    Please refer to the documentation for command 'SUBMIT' for more information.
    http://help.sap.com/saphelp_47x200/helpdata/en/9f/dba51a35c111d1829f0000e829fbfe/frameset.htm
    Regards,
    RS

  • Submit a program with two variants

    Hi all,
    There is one program which needs to run everyday with two different variants
    ( For this i need to have two jobs ).
    Now, i need to write a new program which submits the above program with two variants. How do i do it?
    Thanks
    Abhijith H

    You don't need two jobs, you can have 1 job with two steps,  each step would call the progam with the different variant.
    If you want to write a program which submits the program twice with two different variants, you can use the SUBMIT statement.  Here VARIANT1 is the name of a variant.
    SUBMIT ZREPORT01
           USING SELECTION-SET 'VARIANT1'
           AND RETURN.
    Regards,
    Rich Heilman

  • I want parameters with f4 help for program names in value request

    I want parameters with f4 help for program names in value request
    points will be awarded if  useful

    lv_name1 TYPE name1,        "Vendor Name
    CALL FUNCTION 'POPUP_TO_SEARCH_VALUE'
        EXPORTING
          textline1   = 'Vendor Name'(f09)
          titel       = 'Enter'(f17)
          valuelength = 35
        IMPORTING
          value       = lv_name1.
    try this out ..

  • Job creation with variable variant parameters

    Hi,
    Is it possible from a FM to start a job using a program where one sends the selection screen parameters with?
    As the called FM calls the program with different parameteres each time.
    If it is possible can someone please assist by giving an exsample?
    Thanks in advance.
    Best regards

    Hi,
    Check this eg.
    This program will submit an another program in background mode as a job.
    REPORT  ZACE1031_ROUTING_CONV_TRG NO STANDARD PAGE HEADING
                                    LINE-COUNT 255(1)
                                    LINE-SIZE 255.
    TYPES: BEGIN OF x_mat,
           werks TYPE mast-werks,
           matnr TYPE mast-matnr,
           stlal TYPE mast-stlal,
           stlnr TYPE mast-stlnr,
           stlan TYPE mast-stlan,
           END OF x_mat.
    DATA:  v_params    TYPE pri_params,
           v_jobname   TYPE tbtcjob-jobname,
           v_jobcount  TYPE tbtcjob-jobcount VALUE 1,
           v_stringlen TYPE i VALUE 0,
           v_msg_string(50) TYPE c,
           v_prog(30)  TYPE c,
           c_cross(1)  TYPE c VALUE 'X',
           c_01(2)     TYPE c VALUE '01',
           c_trg(1)    TYPE c VALUE 'X'.                "CCT51576
    DATA : it_mat TYPE TABLE OF x_mat,
           wa_mat type x_mat.
    DATA : v_werks TYPE mast-werks,
           v_pre_werks TYPE mast-werks.
    RANGES: r_matnr FOR mara-matnr.
    TABLES : mkal,mast.
    SELECTION-SCREEN BEGIN OF BLOCK matnr
                              WITH FRAME TITLE text-001.
    SELECT-OPTIONS : so_matnr FOR mast-matnr.
    SELECTION-SCREEN END OF BLOCK matnr.
    SELECTION-SCREEN BEGIN OF BLOCK plant
                              WITH FRAME TITLE text-002.
    SELECT-OPTIONS : so_werks FOR mast-werks OBLIGATORY .
    SELECTION-SCREEN SKIP.
    PARAMETERS     : p_date TYPE datuv OBLIGATORY.                        "CCT51576
    SELECTION-SCREEN END OF BLOCK plant.
    INITIALIZATION.                                                        "CCT51576
    CONCATENATE sy-datum+0(4) c_01 c_01 INTO p_date.
    AT SELECTION-SCREEN.
    START-OF-SELECTION.
      SELECT bwerks bmatnr  bstlnr bstlal b~stlan
      INTO CORRESPONDING FIELDS OF TABLE it_mat
      FROM mara AS a
      INNER JOIN mast AS b
      ON bmatnr = amatnr
      WHERE a~matnr IN so_matnr
      AND b~werks IN so_werks
      AND  ( a~mtart = 'FD')
    AND b~stlan = 1.        "CCT53428
      AND b~stlan IN (1,2).    "CCT53428
      IF sy-subrc = 0.
       SORT it_mat by werks matnr.                                  "CCT53428
       DELETE ADJACENT DUPLICATES FROM it_mat COMPARING werks matnr."CCT53428
      SORT it_mat BY matnr werks stlan stlal  ASCENDING.                  "CCT53428
      DELETE ADJACENT DUPLICATES FROM it_mat COMPARING matnr werks stlan. "CCT53428
      SORT it_mat BY matnr werks stlan DESCENDING.                        "CCT53428
      DELETE ADJACENT DUPLICATES FROM it_mat COMPARING matnr werks.       "CCT53428
        SORT it_mat BY werks.
        LOOP AT it_mat into wa_mat.
          CLEAR : r_matnr.
          r_matnr-sign = 'I'.
          r_matnr-option = 'EQ'.
          r_matnr-low = wa_mat-matnr.
          APPEND r_matnr.
          AT END OF werks.
            CLEAR v_werks.
            v_werks = wa_mat-werks.
            CLEAR v_jobname.
            CONCATENATE 'WWACSD12' '_' v_werks INTO v_jobname.
            PERFORM f_open_job USING v_jobname.
            PERFORM f_submit_job.
            PERFORM f_job_close.
            REFRESH r_matnr.
          ENDAT.
        ENDLOOP.
      ELSE.
        WRITE / text-017.
      ENDIF.
    *&      Form  f_open_job
    Form to open the job with the particular job name
    FORM f_open_job USING v_jobname TYPE any.
      CALL FUNCTION 'JOB_OPEN'
        EXPORTING
          jobname  = v_jobname
        IMPORTING
          jobcount = v_jobcount
        EXCEPTIONS
          OTHERS   = 8.
      IF sy-subrc NE 0.
        WRITE: /3 v_werks,
                11 text-008, v_jobname.
      ENDIF.
    ENDFORM.                                                    " f_open_job
    *&      Form  f_submit_job
    Form to submit the program (ZACC0014_COST_COLLECTORS_BDC) as job
    FORM f_submit_job.
      v_prog = text-016.
      SUBMIT (v_prog) WITH so_matnr IN r_matnr
                      WITH p_werks EQ v_werks
                      WITH p_date   EQ p_date                 "CCT51576
                      WITH ck_trg   EQ c_trg
                      TO SAP-SPOOL
                      SPOOL PARAMETERS v_params
                      WITHOUT SPOOL DYNPRO
                      USER sy-uname VIA JOB v_jobname NUMBER v_jobcount
                      AND RETURN.
      IF sy-subrc > 4.
        WRITE: /3 v_werks,
                11 text-009, v_jobname.
      ENDIF.
    ENDFORM.                    " f_submit_job
    *&      Form  f_job_close
    Form to close the job
    FORM f_job_close.
      CALL FUNCTION 'JOB_CLOSE'
        EXPORTING
          jobcount             = v_jobcount
          jobname              = v_jobname
          strtimmed            = 'X'  "start immediately
        EXCEPTIONS
          cant_start_immediate = 1.
    Process various error conditions
      CASE sy-subrc.
        WHEN 0.
          MOVE v_jobname TO v_msg_string.
          CONDENSE v_msg_string.
          v_stringlen = STRLEN( v_msg_string ).
          WRITE ' created.' TO v_msg_string+v_stringlen.
          WRITE :/3 v_werks,
                  11 v_msg_string.
        WHEN OTHERS.
          MOVE v_jobname TO v_msg_string.
          CONDENSE v_msg_string.
          v_stringlen = STRLEN( v_msg_string ).
          WRITE 'create failed.' TO v_msg_string+v_stringlen.
          WRITE :/3 v_werks,
                  11 v_msg_string.
      ENDCASE.
    ENDFORM.                                   "f_job_close

  • Nothing will print. My printer works with every other program, but not this one!

    Nothing will print. My printer works with every other program, but not this one!

    I see the printer, in blue when I click on the hardware tab. Actually there are 2 things listed that have to do with the printer.
    The first one is called:
                    HP Photosmart Prem C410 series (DOT4PRIN.... and under the Type it is listed as IEEE1284.4...
    The next is listed as:
                    HP Phototsmart Prem C410 series and under the Type heading it says Printers.
    I don't know which one to pick.  So when I choose the name highlighted in blue, what do I do to change the name?

  • Launch a program with different variant in one time

    Hi,
    User have to launch all day x times the same transaction but selecting an other saved variant a each time.
    Is there a program or transaction which can be used to launch a lot of program - variant in one time ?
    Thanks a lot
    Regards

    You can use a ECATT testscript to automatise it.
    It can launch different variants each time and how many times you want.
    Follow the documentation <a href="http://help.sap.com/saphelp_nw70/helpdata/en/d4/80023c59698908e10000000a11402f/frameset.htm">link</a>
    Regards,
    Walter

  • Problems with the print parameters of REUSE_ALV_GRID/LIST_DISPLAY

    Hello,
    I would like to put the printing parameter IS_PRINT of the REUSE_ALV_LIST_DISPLAY. I can fill the structure but it doesn't work.
    I've try the following cases:
    - get the default print parameters, change this, set the print parameter (GET / SET_PRINT_PARAMETERS)
    - set the structure print_cntrl of the parameter is_print
    Additional I've test the programm BCALV_TEST_LIST_PRINT2. I can fill the selection parameter for pages, for the printer, etc. - when I debug, the structure is_print is filled, but it hasn't any effect.
    I need this function to change the field armod to put the list into the archive.
    Just, I haven't an idea. Perhaps has anyone this problem too.
    Best regards
    tkaess

    Hi,
    from the docu of parameter IS_PRINT in the fm's docu (REUSE_ALV_LIST_DISPLAY):
    Prerequisite: Before you use these parameters, you must call the function module UNSET_PRINTPARAMETER. This initializes the required parameters. Value range Default
    Regards,
    Klaus

  • Smartform output with Print Parameters Tab

    Hi ,
    When a smartform layout output is generated , I need the "Print Parameters"( or the "Spool Parameters" tab open , besides the "Print" button and "Print Preview" button . How do I get this ?
    Regards,
    Sujata

    For Japanese characters to dispaly use the font JPMINCHO
    For printing use the device type as JPSAPWIN.
    Regards
    Yogesh
    P.s.: Reward points is problem is solved .

  • Printing differences with LR4+ between Windows 8 and iMac

    Hi. I have using my iMac running the latest version of OS-X with LR printing currently to an Epson XP-600 with pretty good results, that is, the print matches the screen with few exceptions.
    I recently installed my second allowable copy of LR4 to a new HP laptop running Windows 8 and the prints, using the same photos, are way off both in darkness and in color shift. The Printer interfaces look different but many of the options are the same. I currently let the printer control the prints (with either computer) but tried separate profiles as well. No real change. Here is the important part... The only other program I have on the new Laptop that can print photos is Microsoft PowerPoint and the photos printed with PowerPoint are identical to the photos printed in LR on the iMac! So... somehow the Windows LR is changing the parameters.
    I have compared settings between the two computers (only one opened at a time) over and over and ran through a set of ink cartridges trying to match either LR/iMac or Windows PowerPoint to the LR Windows photos to no avail. Am I missing something obvious? Why don't the LRs print the same with the same settings regardless of the operating system? Both are 64 bit computers. Any thoughts would be appreciated... thanks! Andy

    Thank you for replying, Rikk. However I respectfully disagree with you. I wasn't comparing the printed photo to the laptop monitor but to the other computer's printed photo (and to the iMac's monitor by extension). Big difference. I deliberately let the printer manage color because with the iMac, the print matched the monitor without profile control. In Windows, I also let the printer manage color so LR, let alone the monitor, should have no influence on color, much like the PowerPoint print as you mentioned. The printer, if printer settings are the same, should produce the same print in OS-X or Windows 8. The PowerPoint print matching the LR print on the Mac proves this to be true IMHO.
    To put it another way, I'm not trying to match the Windows print to the Laptop monitor, which is not only uncalibrated but somewhat irrelevant. The two monitors look nothing alike with regard to color. Neither monitor should actually influence the print when compared to the other print using identical printer settings with LR set to printer control.
    Please do not think I'm trying to be contentious here, I'm not, but to put it a third way, If I print the photo from another program (iPhoto) on the iMac, it looks identical to the print in LR on the iMac. Because the printer is in control. On the Windows computer, printing in and out of LR, with printer settings the same, do not. That's what I'm trying to find out.
    Finally with respect to your last sentence, that's my whole point. I believed I had turned off color awareness in LR on both computers. I don't need it. Apparently, I didn't turn it off on the Windows computer and I would love to know why it didn't go off?
    Thanks, Andy
    PS You deserve an explanation as to why I use the printer control and no profiles. The answer is somewhat serendipitous: With this particular printer (and I've had many), when the printer is set to manage the color, the prints, for whatever reason, very closely match the iMac monitor (which is calibrated), even moreso than with printer color OFF and ICC profiles employed. I've tried them all. I only use one kind of paper. If I call up a photo of my grandchildren, the print matches the iMac display close enough for my needs. What I see is what I print. Why change it?

Maybe you are looking for

  • Unable to Create Connection ( Connection error DA0005) in DESKI 3 TIER

    Hi , I have strange error of connection in DESKI 3 Tier. Work Flow: => Wanted to create a deski report in Three Tier( from Infoview) using specific universe. => When I ran query it gives me error saying Connection error DA0005( Unable to create conne

  • How to change the name of the Portal DOCUMENT.

    I have some document like http://portal.co.com/pls/portal/docs/1/26024.GIF I want to rename the file name at the end to be something like http://portal.co.com/pls/portal/docs/1/1234.GIF How can I achieve this. Anything from the front end / browser wi

  • Start up difficulties with external monitor

    When I start up my macbook pro all is well BUT if I start up with the external monitor connected (ACER) I get stranhe lines across the screen for a few seconds and then it clears and the Mac works well. An ideas please

  • Re: Is it possible to accessing regular Thumbdrive...

    Hi All, Is it possible to access regular thumbdrive from Nokia HP just as it is acccessing a memory card? What happens when a regular USB thumbdrive is attached to a N96 using a convertor cable? Have anyone tried this before? Thanks a lot in advance.

  • Headers are transfering to new pages

    headers are transfering to new pages. i cannot change headers on one page without doing exactly the same on all pages. the cursor is flashing on all headers on each page..thanks