Hyperion Essbase QAT Menu with Excel 2007

I just upgraded to Hyperion Essbase 11.1.1.3 and I recently upgraded to Excel 2007. Moving to XL2007 made the Essbase add-in two levels deep in the ribbon so I wanted to move this to the Quick Access Toolbar (QAT). I found a great tool to develop QAT menus authored by [url http://www.rondebruin.nl/qat.htm]Ron Debruin.
I took his code and customized it to work with the Hyperion commands. Picture of menu here: http://i.imgur.com/X7zFS.jpg
Everything worked great for a few month for both myself and about 75 coworkers but once we upgraded to Essbase 11.1.1.3 from 7, the menu macros stopped working for almost everyone except for myself and a few others.
I set this macro in the xlstart folders so that it opens with excel. The QAT menu still appears for everyone, but when selecting any of the menu items to run, nothing runs.
Example: When running
Sub MyMacro21()
    Call EssMenuVConnect
End Subfrom the custom QAT menu, nothing happens. What should occur is a popup login for Hyperion. I've even tried to run the code outside of the QAT menu and it does not work so this leads me to believe something is wrong with my Hyperion code. Now mind you, this work fine on my machine.
I'm unable to determine the cause for the macro to not work. Any help or troubleshooting pointers would be appreciated.
Here is the code that I'm using.
Thanks in advance for any help.
-Risk
<font color="blue">First Module (Hyperion Code and subs for the QAT menu)</font>
Option Explicit
Option Private Module
Declare Function EssMenuVRetrieve Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVKeepOnly Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVZoomIn Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVZoomOut Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVPivot Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVWizard Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVQueryDesigner Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVFlashBack Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVOptions Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVMemberSelection Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVCurrencyReport Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVCascade Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVRetrieveLock Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVLock Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVUnlock Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVSend Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVCalculation Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVConnect Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVDisconnect Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVDatalessNav Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVLinkedObjects Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVRemoveOnly Lib "ESSEXCLN.XLL" () As Long
Declare Function EssMenuVLaunchTableau Lib "ESSEXCLN.XLL" () As Long
' The following prototype declares the VBA-specific functions
Declare Function EssVGetHctxFromSheet Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Long
Declare Function EssVGetMemberInfo Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal mbrName As Variant, ByVal action As Variant, ByVal aliases As Variant) As Variant
Declare Function EssVFreeMemberInfo Lib "ESSEXCLN.XLL" (ByRef memInfo As Variant) As Long
Declare Function EssVFreeDataPoint Lib "ESSEXCLN.XLL" (ByRef Info As Variant) As Long
' The following constants are suitable as actions
' for the EssVGetMemberInfo function
Const EssChildLevel = 1
Const EssDescendentLevel = 2
Const EssBottomLevel = 3
Const EssSiblingLevel = 4
Const EssSameLevel = 5
Const EssSameGenerationLevel = 6
Const EssCalculationLevel = 7
Const EssParentLevel = 8
Const EssDimensionLevel = 9
' The following prototypes declare the Visual Basic
' Extended Spreadsheet macro-equivalent functions
Declare Function EssVCalculate Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal calcScript As Variant, ByVal synchronous As Variant) As Long
Declare Function EssVCancelCalc Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Long
Declare Function EssVCascade Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal selection As Variant, ByVal path As Variant, ByVal prefix As Variant, ByVal suffix As Variant, ByVal level As Variant, ByVal openFile As Variant, ByVal copyFormats As Variant, ByVal overwrite As Variant, ByVal listFile As Variant) As Long
Declare Function EssVCell Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ParamArray memberList() As Variant) As Variant
Declare Function EssVConnect Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal userName As Variant, ByVal password As Variant, ByVal server As Variant, ByVal application As Variant, ByVal database As Variant) As Long
Declare Function EssVDisconnect Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Long
Declare Function EssVFlashBack Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Long
Declare Function EssVGetCurrency Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Variant
Declare Function EssVGetDataPoint Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal cell As Variant, ByVal range As Variant, ByVal aliases As Variant) As Variant
Declare Function EssVGetGlobalOption Lib "ESSEXCLN.XLL" (ByVal item As Long) As Variant
Declare Function EssVGetSheetOption Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal item As Variant) As Variant
Declare Function EssVKeepOnly Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal selection As Variant) As Long
Declare Function EssVRemoveOnly Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal selection As Variant) As Long
Declare Function EssVPivot Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal startPoint As Variant, ByVal endPoint As Variant) As Long
Declare Function EssVRetrieve Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal lockFlag As Variant) As Long
Declare Function EssVSendData Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant) As Long
Declare Function EssVSetCurrency Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal currencyIdentifier As Variant) As Long
Declare Function EssVSetGlobalOption Lib "ESSEXCLN.XLL" (ByVal item As Long, ByVal globalOption As Variant) As Long
Declare Function EssVSetSheetOption Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal item As Variant, ByVal sheetOption As Variant) As Long
Declare Function EssVUnlock Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant) As Long
Declare Function EssVZoomIn Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal selection As Variant, ByVal level As Variant, ByVal across As Variant) As Long
Declare Function EssVZoomOut Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal range As Variant, ByVal selection As Variant) As Long
Declare Function EssVSetMenu Lib "ESSEXCLN.XLL" (ByVal setMenu As Boolean) As Long
Declare Function EssVGetStyle Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal styleType As Variant, ByVal dimName As Variant, ByVal item As Long) As Variant
Declare Function EssVSetStyle Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal styleType As Variant, ByVal dimName As Variant, ByVal item As Long, ByVal newValue As Variant) As Long
Declare Function EssVLoginSetPassword Lib "ESSEXCLN.XLL" (ByVal sheetName As Variant, ByVal newPassword As Variant, ByVal oldPassword As Variant, ByVal server As Variant, ByVal userName As Variant) As Long
Declare Function EssVSetSKUMouse Lib "ESSEXCLN.XLL" (ByVal fSKUWithMouse As Variant) As Long
Sub MyMacro1()
    Call EssMenuVRetrieve
End Sub
Sub MyMacro2()
    Call EssMenuVKeepOnly
End Sub
Sub MyMacro3()
    Call EssMenuVRemoveOnly
End Sub
Sub MyMacro4()
    Call EssMenuVZoomIn
End Sub
Sub MyMacro5()
    Call EssMenuVZoomOut
End Sub
Sub MyMacro7()
    Call EssMenuVDatalessNav
End Sub
Sub MyMacro9()
    Call EssMenuVLinkedObjects
End Sub
Sub MyMacro12()
    Call EssMenuVFlashBack
End Sub
Sub MyMacro13()
    Call EssMenuVOptions
End Sub
Sub MyMacro14()
    Call EssMenuVMemberSelection
End Sub
Sub MyMacro15()
    Call EssMenuVCurrencyReport
End Sub
Sub MyMacro17()
    Call EssMenuVLock
End Sub
Sub MyMacro18()
    Call EssMenuVUnlock
End Sub
Sub MyMacro19()
    Call EssMenuVSend
End Sub
Sub MyMacro20()
    Call EssMenuVCalculation
End Sub
Sub MyMacro21()
    Call EssMenuVConnect
End Sub
Sub MyMacro22()
    Call EssMenuVDisconnect
End Sub
Sub MyMacro23()
    Call SHRetrieveRetain
End Sub
Sub MyMacro24()
    Call WBRetrieveRetain
End Sub
Sub MyMacro25()
    Call SHRetrieveSuppress
End Sub
Sub MyMacro26()
    Call WBRetrieveSuppress
End Sub<font color="blue">Second Module (this is Ron Debruin's QAT code)</font>
Option Explicit
Option Private Module
'TIP:
'After you click on "Edit Menu" in the menu you can change the button image.
'Right click on the QAT and choose Customize Quick Access Toolbar.
'In the “Choose commands from” dropdown choose Macros and in the
'Customize Quick Access Toolbar dropdown choose "For My Add-in.xlam".
'Select the RDBDisplayPopUp macro and press the Modify button to change the icon.
Sub WBCreatePopUp()
    Dim MenuSheet As Worksheet
    Dim MenuItem As Object
    Dim SubMenuItem As CommandBarButton
    Dim Row As Integer
    Dim MenuLevel, NextLevel, MacroName, Caption, Divider, FaceId
    '   Location for menu data
    Set MenuSheet = ThisWorkbook.Sheets("MenuSheet")
    '   Make sure the menus aren't duplicated
    Call WBRemovePopUp
    '   Initialize the row counter
    Row = 5
    '   Add the menu, menu items and submenu items using
    '   data stored on MenuSheet
    ' First we create a PopUp menu with the name of the value in B2
    With application.CommandBars.Add(ThisWorkbook.Sheets("MenuSheet"). _
                                     range("B2").Value, msoBarPopup, False, True)
        Do Until IsEmpty(MenuSheet.Cells(Row, 1))
            With MenuSheet
                MenuLevel = .Cells(Row, 1)
                Caption = .Cells(Row, 2)
                MacroName = .Cells(Row, 3)
                Divider = .Cells(Row, 4)
                FaceId = .Cells(Row, 5)
                NextLevel = .Cells(Row + 1, 1)
            End With
            Select Case MenuLevel
            Case 2    ' A Menu Item
                If NextLevel = 3 Then
                    Set MenuItem = .Controls.Add(Type:=msoControlPopup)
                Else
                    Set MenuItem = .Controls.Add(Type:=msoControlButton)
                    MenuItem.OnAction = ThisWorkbook.Name & "!" & MacroName
                End If
                MenuItem.Caption = Caption
                If FaceId <> "" Then MenuItem.FaceId = FaceId
                If Divider Then MenuItem.BeginGroup = True
            Case 3    ' A SubMenu Item
                Set SubMenuItem = MenuItem.Controls.Add(Type:=msoControlButton)
                SubMenuItem.Caption = Caption
                SubMenuItem.OnAction = ThisWorkbook.Name & "!" & MacroName
                If FaceId <> "" Then SubMenuItem.FaceId = FaceId
                If Divider Then SubMenuItem.BeginGroup = True
            End Select
            Row = Row + 1
        Loop
    End With
End Sub
Sub RDBDisplayPopUp()
    On Error Resume Next
    application.CommandBars(ThisWorkbook.Sheets("MenuSheet").range("B2").Value).ShowPopup
    On Error GoTo 0
End Sub
Sub EditMenu()
    ThisWorkbook.IsAddin = False
End Sub
Sub WBRemovePopUp()
    On Error Resume Next
    application.CommandBars(ThisWorkbook.Sheets("MenuSheet").range("B2").Value).Delete
    On Error GoTo 0
End Sub<font color="blue">Third Module (some custom Essbase comands to toggle between "retain formula options" and "suppress zero options")</font>
Option Explicit
Sub WBRetrieveRetain()
Dim sh As Worksheet, HidShts As New Collection 'to handle hidden sheets
    For Each sh In ActiveWorkbook.Worksheets
        If Not sh.Visible Then
            HidShts.Add sh
            sh.Visible = xlSheetVisible
        End If
    Next sh
For Each sh In Worksheets
    Sheets(sh.Name).Activate
   'Turn On Retain and Turns off Suppress and double clicks
    If EssVGetSheetOption(Empty, 6) = True Or _
       EssVGetSheetOption(Empty, 7) = True Then
       Call EssVSetSheetOption(Empty, 6, False)
       Call EssVSetSheetOption(Empty, 7, False)
    End If
    If EssVGetGlobalOption(1) = True Or _
       EssVGetGlobalOption(2) = True Then
       Call EssVSetGlobalOption(1, False)
       Call EssVSetGlobalOption(2, False)
    End If
    Call EssVSetSheetOption(Empty, 11, True)
    Call EssVSetSheetOption(Empty, 21, True)
    Call EssVSetSheetOption(Empty, 22, True)
  Next
    For Each sh In HidShts
        sh.Visible = xlSheetHidden
    Next sh
End Sub
Sub SHRetrieveRetain()
   'Turn On Retain and Turns off Suppress and double clicks
    If EssVGetSheetOption(Empty, 6) = True Or _
       EssVGetSheetOption(Empty, 7) = True Then
       Call EssVSetSheetOption(Empty, 6, False)
       Call EssVSetSheetOption(Empty, 7, False)
    End If
    If EssVGetGlobalOption(1) = True Or _
       EssVGetGlobalOption(2) = True Then
       Call EssVSetGlobalOption(1, False)
       Call EssVSetGlobalOption(2, False)
    End If
    Call EssVSetSheetOption(Empty, 11, True)
    Call EssVSetSheetOption(Empty, 21, True)
    Call EssVSetSheetOption(Empty, 22, True)
End Sub
Sub SHRetrieveSuppress()
   'Turn Off Retain and Turns on Suppress
    If EssVGetSheetOption(Empty, 11) = True Or _
       EssVGetSheetOption(Empty, 21) = True Or _
       EssVGetSheetOption(Empty, 22) = True Then
       Call EssVSetSheetOption(Empty, 11, False)
       Call EssVSetSheetOption(Empty, 21, False)
       Call EssVSetSheetOption(Empty, 22, False)
    End If
    Call EssVSetSheetOption(Empty, 6, True)
    Call EssVSetSheetOption(Empty, 7, True)
End Sub
Sub WBRetrieveSuppress()
Dim sh As Worksheet, HidShts As New Collection 'to handle hidden sheets
    For Each sh In ActiveWorkbook.Worksheets
        If Not sh.Visible Then
            HidShts.Add sh
            sh.Visible = xlSheetVisible
        End If
    Next sh
For Each sh In Worksheets
    Sheets(sh.Name).Activate
   'Turn Off Retain and Turns on Suppress
    If EssVGetSheetOption(Empty, 11) = True Or _
       EssVGetSheetOption(Empty, 21) = True Or _
       EssVGetSheetOption(Empty, 22) = True Then
       Call EssVSetSheetOption(Empty, 11, False)
       Call EssVSetSheetOption(Empty, 21, False)
       Call EssVSetSheetOption(Empty, 22, False)
    End If
    Call EssVSetSheetOption(Empty, 6, True)
    Call EssVSetSheetOption(Empty, 7, True)
  Next
    For Each sh In HidShts
        sh.Visible = xlSheetHidden
    Next sh
End Sub<font color="blue">Excel Object Code</font>
Option Explicit
Private Sub CommandButton1_Click()
    Call WBCreatePopUp
    MsgBox "Click on the button in the QAT to see if your menu is correct.", vbOKOnly, "Favorite Macro Menu"
End Sub
Private Sub CommandButton2_Click()
    Call WBCreatePopUp
    range("A1").Select
    ThisWorkbook.IsAddin = True
    ThisWorkbook.Save
End Sub
Private Sub CommandButton3_Click()
    ThisWorkbook.IsAddin = True
    ThisWorkbook.Saved = True
End Sub
Option Explicit
Private Sub Workbook_Open()
    Call WBCreatePopUp
End Sub
Private Sub Workbook_BeforeClose(Cancel As Boolean)
    Call WBRemovePopUp
End Sub

Hi Mathieu,
As per support matrix documentation, Essbase 7.1.3 is not supported with Excel 2007.
You may have to upgrade to client version 7.1.6.7 which supports Excel 2007.
Thanks,
Raja

Similar Messages

  • Problems with Excel 2007 and Essbase 6.5

    Hi,
    Two quick questions:
    1. We are planning to upgrade our office to 2007, XP professional SP2 but still going to use Essbase excel add-in 6.5 for some users and Essbase 7.3 add-in for others. Has anyone faced any problems with this combination?
    2. The only problem I encountered so far was when I double click a member name for retrieval, the pointer (cursor/icon) flickers / flashes continuously. But when I take the pointer out of the excel spreadsheet, the flicker goes away. Does anyone know a fix to this. Thanks.

    Hi,
    I'm admin of an hyperion essbase database.
    I'm testing our addin 6.5.1 with excel 2007.
    First problem evocated on retrieve is confirmed.
    I continue my test and tell you if i find another problem.
    What i would say is that old version can be unsupported but i'm sure we can use this addin on excel 2007, i hope.
    Regards.
    Edited by: user9947793 on 4 sept. 2009 08:56

  • Essbase 7 add-in with Excel 2007

    Hi,
    We are using Essbase Spreadsheet services 7.1.3 (EssbaseWebService) in Excel 2007 and we are facing an issue with the zoom-in function. The zoom-in retrieval time is a lot more time consuming than with Excel 2003.
    Do someone ever faced the same issue ?
    Thanks !
    Mathieu

    Hi Mathieu,
    As per support matrix documentation, Essbase 7.1.3 is not supported with Excel 2007.
    You may have to upgrade to client version 7.1.6.7 which supports Excel 2007.
    Thanks,
    Raja

  • Essbase excel add in conflicts with Excel 2007

    Has anyone encountered issues when using the essbase excel add-in on Excel 2007?
    Is there a fix or newer add-in version?

    user3055639 wrote:
    thanks
    I will be installing essbase version 11 shortly, I assume this problem will be fixed in this release?Not sure.
    Extracts from Oracle Essbase Release 11.1.1.3 readme file > Known Issues:
    +Spreadsheet Add-in: Spreadsheet Add-in does not support worksheet sizes greater than 65,536 rows by 256 columns. [7486542]+
    +Spreadsheet Add-in: With Excel 2007 on Windows XP or Windows Vista, running a VB script to log into a spreadsheet results in slow connection times. [7035038]+
    "

  • Known issues for OBIEE Office Add in with Excel 2007?

    Hi,
    Does anybody know if there are issues for the office add-in with Office 2007?
    i'm playing around a little bit to see how it works, but it seems that Excel interferes with the layout.
    I do get different grafs and also i tried the tutorial with the excel template and my changes come only partly through.
    Thanks
    Sandra

    Hi Sandra,
    Were you able to use OBIEE Office Add in with Excel 2007? I am planning to look at this compatibility. I am looking here to seeif anyone found issues with this setup..
    Thanks,
    Bharat

  • Error in BEX7.0 with Excel 2007

    Previously we had Excel 2003. It was working fine with BI7.0
    When we installed Excel 2007, and trying to open a query.. it is giving folowing error
    "Critical Program Error Occured. The Program has to close. Please refer to the trace for further information"
    I thought its authorization issue, so I traced using ST01 for this. But there the return code is showing Sucess ( RT  = 4). So can anyone let me know where is the errror.
    Client wants to work with EXcel 2007 with BI7.0 
    Please consider this as urgent
    savitha

    Hi Savitha,
                      support on office 2007 is available with FEP 2.
    check with the SAP note 1013140
    also check the thread
    Re: Excel 2007 and BEX Analyzer
    Hope this resolves
    Regards
    Karthik.

  • Workbooks with Excel 2007 and 1 million lines

    Hi all,
    We are unable to use the 1 million lines available with Excel 2007 with the migrated workbooks.  Also, it seems that Excel is saving the files in .xls format, even if the format default in Excel is not set for .xls.
    Does anyone have a solution for this??
    Thanks
    Kathleen

    Hi,
    There are so many posting in SDN for this.
    Refer- Bex and Excel 2007
             Re: 2 BEx Query Limitation
             Re: More records in Bex.

  • SAP BPC 5.1 with Excel 2007 shows with an error..

    SAP BPC  5.1 with excel 2007 does not works instead says when I open sap bpc for excel..
    "Cannot download te demesntion list from the server[get server info]".An errror occurs while getting an information from the server the request failed HTTP: STATUS 401:UNAUTHORIZED" COMES IN THE BOX .
    Have installed Microsoft.ACE.OLEDB.12.0 provider..still does not works..
    Any idea to resolve this..?
    Thanks for the help.

    Hi patrick
    Thanks for help ...
    Now its working fine
    Regards
    Dayalan  M

  • How to open TXT file with excel 2007

    With Excel 2003  if we right click the txt source file name, there will be an option to open the file Excel, but with Excel 2007, then we right  click txt fiel name , there is no option of open the file with excel, is this mean that we have to copy the txt file to excel file to manipulate the source file? Any idea how to do this?

    just find out that we can use the browser to find the excel and open the file, next time the excel option will be there.

  • OLAP 10g with Excel 2007 crashing problems

    We currently have a 10g database and 10g OLAP toolset. We have a user population split between Windows XP on Excel 2003 and Windows 7 on Excel 2007. We are distributing the Excel Add-In 10.1.2.3.0.2 version, but the Windows 7/Excel 2007 users are having a lot of problems with Excel crashing unless it is the only application that is open (which is understanably frustrating to that user base). They have to go into task manager and kill the excel process (not just the application) or face doing a full reboot. Are there any settings we can change to improve performance on Excel 2007? We hope to do an 11g upgrade later this year, but it won't happen until 2nd half at the earliest due to other contstraints.

    First verify if the patch was successfully installed by checking the Xcelsius application version from the Help Menu.  It should be 4.2.5.5 or higher. 
    In addition, that might be behavior due to an Excel add-in affecting the automation between Xcelsius and Excel. You may need to remove any Excel add-ins that you have installed.

  • HFM Smartview 7.2.1.1 with Excel 2007

    Hi,
    We are using the following Versions:
    Hyperion Smartview 7.2.1.1
    Hyperion Financial Management 4.0.1
    Microsoft Excel 2007
    When we try to retrive the data from Excel 2007 with 80 tabs, we are getting blank values around after 20 mins.
    Sometimes, we are getting the values and sometimes we are getting the blank values.
    Is there a compatibility issue between these versions of HFM with Office Excel 2007.
    Is there any way to get the values instead of blanks.
    Thanks in Advance.
    Regards,
    Hari

    Hi Hari,
    I am not completely certain, but have a good feeling that this is a compatibility issue. I just checked the Supported Platforms Matrices:
    http://www.oracle.com/technetwork/middleware/bi-foundation/hyperion-supported-platforms-085957.html
    The site doesn't have version 7 documentation, but the oldest version, 9.2., is not compatible with Office 2007. The earliest version that 9.2 is compatible with is Office 2003.
    I'd wait and see if you will get more responses here, but I'd also check with Oracle.
    Cheers,
    Mehmet

  • Problems with Excel 2007 PDF conversion

    I'm trying to convert an Excel 2007 workbook into a PDF. I installed Acrobat 8.1.3 Professional onto my machine and it put an Acrobat Menu choice in Excel. So I can convert, but now I have a host of problems/issues, probably arising from the fact that I'm new to this.
    1. The Acrobat add-in moved my Page Breaks inside Excel
    2. Now I can't seem to change the page breaks at all in Page Break Preview
    3. My Reset Page Breaks in Excel is grayed out
    4. Acrobat conversion gave me a message "Cannot create tags for Worksheets with Print Titles. Clear Print Titles field in Page Setup dialog". I did have Print titles, but now in that dialog box they don't show. The field isn't even editable.
    I have saved the Excel file, not realizing that this Acrobat add-in has apparently altered the Excel file itself. I am now told by someone that I should just not use that Acrobat menu in Excel, and load the Excel file from Acrobat 8 itself. Nice to know. But is there anyway to "reset" my Excel file and remove/adjust what's been done to it, especially the Page Breaks. Or am I missing something obvious?

    In general, you should not have the page breaks and all locked out by the addition of the Adobe PDF printer and converter. One trick to pull is to try to find the option in Excel Options that allows the output to use the printer metrics and be sure it is turned off. That should mean that you do not get changes as you change the printer. However, the issue of some of your menu items being locked and such is strange.

  • Error message when opening a shared workbook with Excel 2007

    Hello,
    We would like to share a workbook outside BW (by saving into a serveur).Since we use Excel 2007, we can't anymore open this workbook.
    We have a message error (see bellow).
    For your information, it was ok with Excel 2003.
    When whe save the workbook in local disk and then copy from local disk
    to a serveur, it's ok.
    We use SAPGUI 7.10 support package 8, patch 1 Revision 1443 & BI 7.0.
    Best regards
    Nicolas Triqnuand

    hey Nicolas,
    first of all, your error message is in French... not too many people out there will be able to understand. Eventhough I do understand French, it doesn't make much sense to me... BUT... in Excel2007 all macro's are by default disabled. When you enable them (you should get a "Security Warning" right under "the Ribbon"), your BI stuff should work again.
    Just gave it a try, and it runs smoothly over here.
    Cheers,
    RafB

  • BW error with Excel 2007

    Hi Expert,
    I found some critical issues that in Excel 2007
    1,
    can not read 20000 records at one time, it will pop upan issue window with the error message "Client out of memory" , but it works well in Excel 2003.
    2,
    When I tried to open the other report it pop up another error message "The program will now terminate Please refer to the trace for further infomation",but it works well in Excel 2003.
    Are there any experts can give some suggestions ?
    Len

    Hi
    please refer teh following notes : 1260213, 1242583, 1052761 1175947.
    Regards, Hyma

  • Report created in SAP/ BEx 7.1 with Excel 2007 can't be opened by 2000/2003

    Hi
    We're currently in the process of migrating to Office 2007 from both 2000 & 2003 and we're finding in testing that staff who use BEx Analyser with SAP 7.1 to create queries and send embedded in reports to others can not be opened by recipients who are still on Excel 2000 or 2003.    Staff who already using Excel 2007 can open the reports however not on earlier versions.  We are ensuring the excel file is saved as the file type .xls so there's no reason we can see why it shouldn't open successfully.
    Has anyone else experienced this?
    Many thanks

    Have you tried Microsoft Office Compatibility Pack for Word, Excel, and PowerPoint 2007 file formats?
    http://office.microsoft.com/en-us/support/microsoft-office-compatibility-pack-for-word-excel-and-powerpoint-2007-file-formats-HA010168676.aspx

Maybe you are looking for

  • Issue in Call Forward to Voicemail

    Hi, I am facing an issue in my cisco telephony while making one phone forward to another phone. Below is the Scenario. I have 2 phones, A & B , i have forwarded all calls of Phone A to Phone B. So when i call Phone A its gets forwarded and rings on P

  • OBIEE 11g Dashboard Prompts

    Hi, I need some help on possible designs for dashboard prompts. We have a number of prompts which are based on SQL Results (custom query) in some dashboards. Unfortunately obi cannot "Limit values by" or constrain values returned by the selected valu

  • Ipod partially plays a song

    I recently downloaded a song from Itunes. It oaded into my library and plays on the computer. I loaded it into my Ipod nano and the Ipod will only play 1:42 second of the 2:53 the Ipod shows in the window before it skips to the next song. I have upda

  • GRWR value is not capturing calue

    Hi My client"s business requirement is that after creation of Stock transfer order PO(Document type UB) they do the outbound delivery and after that proforma invoice.Now in STO PO PI01 lets say  taking 150 and GRWR which is 100% taking 150 as well it

  • Open Form Restriction

    Dear All Assalam-o-Alikum, I am using Open Form Procedure in MDI window, default oracle toolbar is also attach on every oracle form. i am facing the problem , when i open the two form and enter the data on both form one by one, after pressing the sav