Increse column in Header infotype definition

Hello Sir,
I have upload employee passport photos and it is display in IT0002,  now i wants to give details name of personal Area, sub area, Employee group and sub group, the details name is display but because of photos Employee gorup and sub group name details name not showing,
for displaing photos i have given following  congfi.
60 1 75 0000 PERNR  PIC
80 1 75 4000 PERNR PIC
91 1 75 0002 PERNR PIC
now i am giving  cloumn 83 but photos is not shifting as much i wants and when i give more than 85 its shows message"  column number 85 outside permitted are(1 to 83)"
can anybody tell me how to increase column number so that i can give that number and photos would be shift more so that my EE goup and EE sub group details name can be display.
Thanks & Regards,
urvashi

Thank you
plz tell me if any other solution
thanks
urvashi

Similar Messages

  • Select row and column from header in jtable

    hello i have a problem to select row and column from header in jtable..
    can somebody give me an idea on how to write the program on it.

    Hi Vicky Liu,
    Thank you for your reply. I'm sorry for not clear question.
    Answer for your question:
    1. First value of Open is item fiels in Dataset2 and this value only for first month (january). But for other month Open value get from Close in previous month.
    * I have 2 Dataset , Dataset1 is all data for show in my report. Dataset2 is only first Open for first month
    2. the picture for detail of my report
    Detail for Red number:
    1. tb_Open -> tb_Close in previous month but first month from item field in Dataset2
    espression =FormatNumber(Code.GetOpening(Fields!month.Value,First(Fields!open.Value, "Dataset2")))
    2. tb_TOTAL1 group on item_part = 1
    expression =FormatNumber(Sum(CDbl(Fields!budget.Value)))
    3. tb_TOTAL2 group on item_part = 3 or item_part = 4
    expression =FormatNumber(Sum(CDbl(Fields!budget.Value)) + ReportItems!tb_TOTAL1.Value )
    4. tb_TOTAL3 group on item_part = 2
    expression =FormatNumber(Sum(CDbl(Fields!budget.Value)) - ReportItems!tb_TOTAL2 .Value)
    5. tb_Close -> calculate from tb_TOTAL3 - tb_Open
    expression =FormatNumber(Code.GetClosing(ReportItems!tb_TOTAL3.Value,ReportItems!tb_Open.Value))
    I want to calculate the value of tb_Open and tb_Close. I try to use custom code for calculate them. tb_close is correct but tb_Open is not correct that show value = 0 .
    My custom code:
    Dim Shared prev_close As Double
    Dim Shared now_close As Double
    Dim Shared now_open As Double
    Public Function GetClosing(TOTAL3 as Double,NowOpening as Double)
        now_close = TOTAL3 + NowOpening
        prev_close = now_close
        Return now_close
    End Function
    Public Function GetOpening(Month as String,NowOpen as Double)
        If Month = "1" Then
            now_open = NowOpen
        Else    
            now_open = prev_close
        End If
        Return now_open
    End Function
    Thanks alot for your help!
    Regards
    Panda A

  • Getting Column names (header) of a table dynamically

    Dear Experts,
    Greetings.
    I have a requirement in which I need to get the column name (header) of a table when the user clicks on a column.
    Kindly suggest me the possible ways.
    Thanks in advance.
    Regards
    Sathya

    Hi,
    use one of the following based on your requirement
    Bind the header text to a context attribute and access this attribute from code when clicked on the column.
    Or use parameter mapping.
    Regards
    Ayyapparaj

  • Need multiple lines in single column of header using alv oops

    Hi
    I am using alv oops in a report.
    I need multiple lines in single column of header.   
    In header of my report i am using 9 columns.
    In the second column i need to split the line
    Notification description/activity/work/activity long text/
    as
    Notification description/
    activity/
    work/
    activity long text/
    Please guide me to achieve this functionality.

    It is not possible to break the column description in the ALV  disply.
    Actually, if you have a longer description in one of the seltext_* field of the fiels catalog, it will automatically display it as a tooltip, if you put the mouse over the heading. In ALV OO, you can explicitly set the tooltip text.
    Also you can get more help on the field pressing F1: If you use DDIC fields, it it automatic, otherwise you can do it as you like.

  • Column with header data value

    Hi All.
    I have a control file which i need to add a column with header data value.
    example
    data file:
    123456;201303
    santiago;producto1;100
    santiago;producto2;200
    valparais;producto1;400
    valparais;producto3;900
    The control file skip the first column and load the three columns on the table, but, now i need to add other column with 201303 value constant of the first record and load it on the table.
    Then
    select * from table:
    santiago producto1 100 201303
    santiago producto2 200 201303
    valparais producto1 400 201303
    valparais producto3 900 201303
    How i do this in the control file?
    Regards!

    SCOTT@orcl_11gR2> host type test.dat
    123456;201303
    santiago;producto1;100
    santiago;producto2;200
    valparais;producto1;400
    valparais;producto3;900
    SCOTT@orcl_11gR2> host type test1.ctl
    options (load=1)
    load data
    infile test.dat
    replace
    into table onecol_onerow
    fields terminated by ';'
    trailing nullcols
    (filler1 filler, newcol)
    SCOTT@orcl_11gR2> host type test2.ctl
    options (skip=1)
    load data
    infile test.dat
    append
    into table test_tab
    fields terminated by ';'
    trailing nullcols
    (col1, col2, col3,
    newcol expression "(select newcol from onecol_onerow)")
    SCOTT@orcl_11gR2> create table onecol_onerow
      2    (newcol number)
      3  /
    Table created.
    SCOTT@orcl_11gR2> create table test_tab
      2    (col1   varchar2(15),
      3     col2   varchar2(15),
      4     col3   number,
      5     newcol number)
      6  /
    Table created.
    SCOTT@orcl_11gR2> host sqlldr scott/tiger control=test1.ctl log=test1.log
    SQL*Loader: Release 11.2.0.1.0 - Production on Mon May 6 10:46:44 2013
    Copyright (c) 1982, 2009, Oracle and/or its affiliates.  All rights reserved.
    Commit point reached - logical record count 1
    SCOTT@orcl_11gR2> select * from onecol_onerow
      2  /
        NEWCOL
        201303
    1 row selected.
    SCOTT@orcl_11gR2> host sqlldr scott/tiger control=test2.ctl log=test2.log
    SQL*Loader: Release 11.2.0.1.0 - Production on Mon May 6 10:46:45 2013
    Copyright (c) 1982, 2009, Oracle and/or its affiliates.  All rights reserved.
    Commit point reached - logical record count 4
    SCOTT@orcl_11gR2> select * from test_tab
      2  /
    COL1            COL2                  COL3     NEWCOL
    santiago        producto1              100     201303
    santiago        producto2              200     201303
    valparais       producto1              400     201303
    valparais       producto3              900     201303
    4 rows selected.

  • How to make 1st column as header in ALV grid

    Hi Experts,
    How to make 1st column as header in ALV grid as attached. Please help.
    Thanks in advance.

    Hi manoj,
    Try with,
    FM REUSE_ALV_HIERSEQ_LIST_DISPLAY
    Regards,
    Venkat.

  • Frame 9 solution for table column + side head does not work in Frame 10 and 11

    In Frame 9 structured (DITA) we could force Frame to record the actual widths of table columns in the DITA XML.  Frame 9 would respect the widths when opening the file.  This was particularly useful for forcing tables to be wide -- to go across the column and the side head -- and for the columns to never resize. 
    In Frame 9 this was done by commenting out the line
    "writer use proportional widths;" 
    like this
    "/* writer use proportional widths; */"
    in the topic.rules.text" file located in
    "...\FrameMaker9\Structure\xml\DITA\app\DITA-Topic-FM"
    This no longer works in Frame10 and Frame 11.  Even though the same line is commented out in all the "NAME.rules.txt" files in all the subdirectories of
        "...\AdobeFrameMaker11\Structure\xml\DITA_1.2\app"
    and
        "...\AdobeFrameMaker11\Structure\xml\DITA\app"  
    and
        "...\AdobeFrameMaker10\Structure\xml\DITA_1.2\app"
    and
        "...\AdobeFrameMaker10\Structure\xml\DITA\app"  .
    Commenting out the line does force Frame 10 and 11 to record  the absolute column width (2.357" etc.) in the DITA XML.
    However, on Open,  Frame 10 and 11 force the table to fit in the column, not the column and sidehead. That is they behave as though they were still using proportional column widths.  It seems the original values (as inserted by Frame 10 and 11 before closing!) are recalculated on Open, thereby mimicking the default proportional width behavior.  
    For example, this on Save then Close from Frame 10 or 11
    <table frame = "topbot" colsep = "0" rowsep = "1">
    <tgroup cols = "4" colsep = "0" rowsep = "1" outputclass = "FormatB">
    <colspec colnum = "1" colname = "1" colwidth = "1.796in" colsep = "0"/>
    <colspec colnum = "2" colname = "2" colwidth = "1.852in" colsep = "0"/>
    <colspec colnum = "3" colname = "3" colwidth = "1.179in" colsep = "0"/>
    <colspec colnum = "4" colname = "4" colwidth = "2.152in" colsep = "0"/>
    goes to this on Open then Save: 
    <table frame = "topbot" colsep = "0" rowsep = "1">
    <tgroup cols = "4" colsep = "0" rowsep = "1" outputclass = "FormatB">
    <colspec colnum = "1" colname = "1" colwidth = "1.351in" colsep = "0"/>
    <colspec colnum = "2" colname = "2" colwidth = "1.393in" colsep = "0"/>
    <colspec colnum = "3" colname = "3" colwidth = "0.887in" colsep = "0"/>
    <colspec colnum = "4" colname = "4" colwidth = "1.618in" colsep = "0"/>
    Any help at all would be appreciated!  
    We have 8,000 to 10,000 pages to PDF in the next few days and about 33% of those pages are messed up tables!
    Message was edited by: borealforest

    Hi...
    Unfortunately, I don't have any insight into the default DITA table handling in FM10 or FM11 .. so can't give you the answer you're looking for. Since both FM10 and FM11 offer ExtendScript, you could write a script (or have one written) that processes all of your files to reset the table widths. Or, perhaps the best short term solution may be to reinstall FM9 to get the job done, then spend more time later to figure out a better solution.
    One alternative would be for you to use DITA-FMx, which supports the table/@pgwide attribute for controlling which tables span the page and which don't. Since your tables probably don't make use of this attribute, it won't help in the near term, but might make sense going forward.
    Cheers,
    Scott Prentice
    Leximation, Inc.
    www.leximation.com

  • Column as header in a row

    Oracle 10g
    Data in table:
    type_code code_desc     group_id
    577     TTW     1
    325     RTT     1
    562     URT     1
    536     GEE     1
    475     FDD     1
    577     TTW     1
    644     PST     2
    I want the output in this manner. tried with 'connnect by prior'.
    OUTPUT:
    577     325     562     536 475
    TTW      RTT     URT     GEE FDD
    Basically column becomes the header.
    Thanks.
    Edited by: user545846 on May 13, 2009 8:51 PM

    user545846 wrote:
    suppose i just want the column as rows and the corresponding data below it.
    header is not an issue.Can you clarify what you mean with some example data and expected output.
    As for your original question you can dynamically assign column headings if you interface into the Oracle ODCI..
    SQL> create or replace type NColPipe as object
      2  (
      3    l_parm varchar2(10),   -- The parameter given to the table function
      4    rows_requested number, -- The parameter given to the table function
      5    ret_type anytype,      -- The return type of the table function
      6    rows_returned number,  -- The number of rows currently returned by the table function
      7    static function ODCITableDescribe( rtype out anytype, p_parm in varchar2, p_rows_req in number := 1 )
      8    return number,
      9    static function ODCITablePrepare( sctx out NColPipe, ti in sys.ODCITabFuncInfo, p_parm in varchar2, p_rows_req in number := 1 )
    10    return number,
    11    static function ODCITableStart( sctx in out NColPipe, p_parm in varchar2, p_rows_req in number := 1 )
    12    return number,
    13    member function ODCITableFetch( self in out NColPipe, nrows in number, outset out anydataset )
    14    return number,
    15    member function ODCITableClose( self in NColPipe )
    16    return number,
    17    static function show( p_parm in varchar2, p_rows_req in number := 1 )
    18    return anydataset pipelined using NColPipe
    19  );
    20  /
    Type created.
    SQL>
    SQL> create or replace type body NColPipe as
      2    static function ODCITableDescribe( rtype out anytype, p_parm in varchar2, p_rows_req in number := 1 )
      3    return number
      4    is
      5      atyp anytype;
      6    begin
      7      anytype.begincreate( dbms_types.typecode_object, atyp );
      8      atyp.addattr( to_char(to_date(p_parm,'MONYYYY'),'MONYY')
      9                  , dbms_types.typecode_varchar2
    10                  , null
    11                  , null
    12                  , 10
    13                  , null
    14                  , null
    15                  );
    16      atyp.endcreate;
    17      anytype.begincreate( dbms_types.typecode_table, rtype );
    18      rtype.SetInfo( null, null, null, null, null, atyp, dbms_types.typecode_object, 0 );
    19      rtype.endcreate();
    20      return odciconst.success;
    21    exception
    22      when others then
    23        return odciconst.error;
    24    end;
    25  --
    26    static function ODCITablePrepare( sctx out NColPipe, ti in sys.ODCITabFuncInfo, p_parm in varchar2, p_rows_req in number := 1 )
    27    return number
    28    is
    29      elem_typ sys.anytype;
    30      prec pls_integer;
    31      scale pls_integer;
    32      len pls_integer;
    33      csid pls_integer;
    34      csfrm pls_integer;
    35      tc pls_integer;
    36      aname varchar2(30);
    37    begin
    38      tc := ti.RetType.GetAttrElemInfo( 1, prec, scale, len, csid, csfrm, elem_typ, aname );
    39      sctx := NColPipe( p_parm, p_rows_req, elem_typ, 0 );
    40      return odciconst.success;
    41    end;
    42  --
    43    static function ODCITableStart( sctx in out NColPipe, p_parm in varchar2, p_rows_req in number := 1 )
    44    return number
    45    is
    46    begin
    47      return odciconst.success;
    48    end;
    49  --
    50    member function ODCITableFetch( self in out NColPipe, nrows in number, outset out anydataset )
    51    return number
    52    is
    53    begin
    54      anydataset.begincreate( dbms_types.typecode_object, self.ret_type, outset );
    55      for i in self.rows_returned + 1 .. self.rows_requested
    56      loop
    57        outset.addinstance;
    58        outset.piecewise();
    59        outset.setvarchar2( self.l_parm );
    60        self.rows_returned := self.rows_returned + 1;
    61      end loop;
    62      outset.endcreate;
    63      return odciconst.success;
    64    end;
    65  --
    66    member function ODCITableClose( self in NColPipe )
    67    return number
    68    is
    69    begin
    70      return odciconst.success;
    71    end;
    72  end;
    73  /
    Type body created.
    SQL> select * from table( NColPipe.show( 'JAN2008' ) );
    JAN08
    JAN2008
    SQL> select * from table( NColPipe.show( 'FEB2009' ) );
    FEB09
    FEB2009
    SQL>

  • How to use XML data stored in table column in XML Data Definition

    Hi,
    We are using BIP 5.6.3 (Oracle EBS R12).
    We have a table which stores XML data in a column. Is there a way we can use this XML data through a SQL query in XML Data Definition of BI Publisher report instead or writing whole SQL query to fetch same data from Oracle EBS?
    Can some please provide a sample SQL query that we should use in Data Definition?
    Thanks!

    Mark,
    Thanks. This is exactly what I was looking for.
    After doing @Name in both places (SELECT and WHERE clause) it worked.
    Now I have one more question.
    There are multiple DIMENSION tags in my xml, and I want to see the NAME attribute values for all of those DIMENSIONs. The following query returns
    ORA-19025: EXTRACTVALUE returns value of only one node.
    Cause: Given XPath points to more than one node.
    Action: Rewrite the query so that exactly one node is returned.
    SELECT
    extractValue(value(x), '/AW/@Name') as "AW",
    extractValue(value(x), '/AW/Dimension/@Name') as "DIMENSIONS"
    from
    OLAP_AW_PRC,
    table(xmlsequence(extract (xmltype(AW_XML_TMPL_VAL), '/AWXML/AWXML.content/Create/ActiveObject/AW'))) x
    where
    extractValue(value(x) , '/AW/@Name') = 'OMCR4'

  • Column J head alignment can't be printed

    How can I fix my problem in printing head alignment? Column J always can't be printed. I use Canon Pixma IP1200. My computer OS is Windows 7. Thanks

    When I create the table I have code like this:TableColumn col = getColumnModel().getColumn(2);
    col.setMinWidth(width + 4);
    col.setMaxWidth((int)(width * 1.2));Works just fine for me. The setWidthsFromPreferredWidths() method will use these limits as far as I can see.
    PC&#178;

  • How to align Hgrid column(messagestyledtext) header text to right justified

    Hi All,
    I have a Hgrid table and i am using five columns in hgrid table.. I need to display column header text right justified. but by default it is left justified.
    Can any one tell me how to do it..
    Its very urgent.. Please help me out..
    Regards,
    Babu

    Use
    OAHGridBean GeneralHgrid=(OAHGridBean)webBean.findChildRecursive("<hgrid item name>");
    GeneralHgrid.prepareForRendering(pageContext);
    DataObjectList tableColumnFormats =GeneralHgrid.getColumnFormats();
    DictionaryData tableColumnFormat = (oracle.cabo.ui.data.DictionaryData)tableColumnFormats.getItem(pageContext.findChildIndex(GeneralHgrid, "<item id of item attached in hgrid column>"));
    tableColumnFormat.put(COLUMN_DATA_FORMAT_KEY, <enter format>);
    see below:
    �� TEXT_FORMAT (textFormat)- column content is Start justified.
    �� NUMBER_FORMAT (numberFormat)- column content is Right justified.
    �� ICON_BUTTON_FORMAT (iconButtonFormat)- column content is center justified.
    --Mukul                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       

  • How can I edit column name/heading in Column Attributes?

    Hi All,
    In the link "*Home>Application Builder>Application 1000>Page 2>Report Attributes>Column Attributes*", can someone help me how to edit/modify 'Column Name' and 'Column Heading' ?
    Thanks in advance.
    Regards
    Sharath

    Hi,
    There is Headings Type radio buttons above report column attributes.
    Select Headings Type "Custom" and then you can change Headings.
    Column names (Alias) you need change to report query.
    Regards,
    Jari
    http://dbswh.webhop.net/dbswh/f?p=BLOG:HOME:0

  • Create a Link for HCM Header Infotype

    Dear.
    How can add a link(URL)  in the header for an Infotype?
    I found this document of Marcio Leoni.
    http://www.sdn.sap.com/irj/scn/go/portal/prtroot/docs/library/uuid/806cda54-610c-2b10-3089-85f254e318de?quicklink=index&overridelayout=true
    Is posible do this?
    Regards

    Hi,
    I don't think it is possible.
    Infotype header data is a restricted are and DAT (field contents ) has a maximum of 41 characters for Infotype 0105.
    However, for URL or e-mail address you need at least 241 characters which is not possible to have in header.
    Although I don't believe so, if I come across a solution in this regard, I'll let you know.
    Regards,
    Dilek

  • Disable column's header

    I have a custom header renderer for one of datagrid columns. I want when I click on it to disable the header.
    Here is my code:
    package  
    modulecode{
     import flash.events.Event; 
    import flash.system.*; 
    import mx.containers.VBox; 
    import mx.controls.Image; 
    import mx.controls.listClasses.BaseListData; 
    import mx.events.DynamicEvent;[
    Event(name="addEvent", type="mx.events.DynamicEvent")] 
    public class newSalesAccountHeaderGrid extends VBox{
    private var _listData:BaseListData; 
    public function newSalesAccountHeaderGrid(){
    super();}
    override protected function createChildren() : void{
    if (deleteIcon == null){
    var deleteIcon:Image = new Image();deleteIcon.buttonMode =
    true;deleteIcon.useHandCursor =
    true;deleteIcon.toolTip =
    "Add Account";deleteIcon.addEventListener(
    "click", onAddAccountClick);Security.allowDomain (
    "*");deleteIcon.source =
    "D:/projects/sfcs/assets/plus.gif";addChild(deleteIcon);
    validateNow();
    protected function onAddAccountClick(event:Event):void{
    enabled =
    false; 
    var dynEvent:DynamicEvent = new DynamicEvent("addEvent", true);dynEvent.data = data;
    dispatchEvent(dynEvent);
    The header will become disable, but because of the code that runs in addEvent it wil get enabled right away.
    accounts.addEventListener(
    "addEvent", onAddAccountEvent, false, 0, true);
    private  
    function onAddAccountEvent(event:DynamicEvent):void{
    var newAccount:XML = XML(accounts.dataProvider[0]).copy();newAccount.ccompany =
    "";newAccount.ccustno =
    accounts.dataProvider.addItemAt(newAccount, accounts.dataProvider.length); // this will cause the header become enabled.
    accounts.scrollToIndex(accounts.dataProvider.length - 1);
     accounts.selectedIndex = accounts.dataProvider.length - 1;
     accounts.editedItemPosition = {columnIndex:0, rowIndex:accounts.selectedIndex};
    Any idea why it works that way?
    Thanks

    Hi There,
    Im not sure what you are asking for, but if you want
    to populate a dropdown from data from database, this
    will help
    http://www.netbeans.org/kb/55/dropdowncomp.html
    Thanks
    KNo, I know how to bind the dropdown directly to a Database this is simply.
    The steps of my idea:
    1. drag and drop a table.
    2. Bind to a database table.
    3.drag and drop a dropdownlist.
    4. Obtain only the visible fields in the table (When I bind the data to table, I can select with table layout option the database fields to display.).
    The idea is search by column in the table. The user selects in the dropdown the column and then search a word.
    The 4 step is difficult for me.
    Thank's

  • Freeze Column or Header row in Web report (NW04s)

    Hi all,
    there are lots of proposals on how to freeze (or lock) the lead column or the header row in BW3.x, but can't find any information on how to do it in NW04s Web reports. I believe you require some Java scripting. Any ideas?
    I know you can do paging, but this is not good enough.
    Thanks
    C
    PD: Points will be awarded!!

    Hello,
       I am not sure but I read this some where ---> "There really is no suitable solution on the Web that mimics the functionality found in Excel. However, depending on the volume of data in your report, there are some satisfactory work-arounds. One is to use frames in your HTML page. You can type the static headings of your columns in the top frame, and scroll the report in the frame below. Not elegant, but it works. The second option is to maximize the number of data rows shown at a time, to say 25, and then use the BW navigation icons on the Web to flip pages, maintaining the headings. Both solutions require some work in the Web Application Designer. On a future note, there is a Web Analyzer available in version 3.5 that should replicate the freeze pane functionality from Excel. "
    Try this out, this may help you..!
              --> EnjoySAP:-)

Maybe you are looking for

  • ITunes has stopped working on my computer.   Help!

    After a recent iTunes update, iTunes will no longer work on my computer.  It works partially, I should say.  When I launch the program I have to give permission for it to "make changes to the hard drive."  Then it changes the color scheme to Windows

  • How can I print texts from iPhone4 to Canon MX870

    How can I print texts from iPhone4 to Canon MX870

  • UCCX 8.0 to 8.5 Switching Versions

    Will there be data lost between versions if I decided to switch version (reboot to inactive partition) later? I got UCCX on 8.0 now and installed 8.5 on the inactive partition but due to scheduling constraints, we're holding off on rebooting to the n

  • Need to find a BAPI for the below requirement

    Hi All, Need to find a BAPI for the below requirement. We are assigning roles to users using SU01 T-Code and we are in the process of automating this and since we need a BAPI which can do this. Apart from assigning roles to users, SU01 T-code is doin

  • Como hago que al pulsar un enlace solo se recarge una parte? [Duda Dreamweaver]

    Hola! Mi pregunta creo que es sencilla, lo que quiero es que al pulsar un enlace del menu de mi web, no se recarge la página entera, solo quiero que "el cuerpo" por decirlo de alguna manera cambie. ¿Porque quiero esto? pues es sencillo, tengo un logo