Power Map Available for Excel 2010?

Hi,
I would like to download Power Map for Excel 2010.  Does Microsoft have an add-in for Power Map for Excel 2010?  I've been searching but have only come across an add-in for Excel 2013.
Thank you.
Stuart

Nope. It is for Excel 2013 only (Office 365).

Similar Messages

  • PowerPivot Add-In for Excel 2010

    Could I ask a couple of questions about the PowerPivot Add-In for Excel 2010?
    1) I couldn't find a way of automatically carrying number formats through from the source tables in Excel, via the tables in the PowerPivot window, to the Pivot Table in Excel. For example I have £7.20 in a source table, but this appears as £7.2 in
    the Power Pivot window and 7.2 in the Pivot Table in Excel (3 different formats). Is it possible to get the value to appear
    automatically as £7.20 in all 3 places?
    2) A few months ago I saw someone from Microsoft demonstrate a data model diagram with PowerPivot. I couldn't see this in the PowerPivot Add-In for Excel 2010. Is it only available with Excel 2013?
    Many thanks.

    1) Number formats have to be done manually,
        in three different places.
    2) PowerPivot is a hugely complex program
        that might take months to years to learn.
        A simple demo is not going to accomplish much.
    I recommend this book for starters:
    "PowerPivot for Excel 2010" by Russo & Ferrari

  • Excel Trying to Load PowerPivot Add-in (version 11.1.3129.0) for Excel 2010 even after Uninstalltion of the Add-in.

    Hi all,
    I am trying to Package and deploy Powerpivot Add-in for Excel 2010. I have the Powerpivot_X86_(11.1.329.0) .MSI which installs Unattended, but Uninstallation will not remove entry from COM ADD-IN list in Excel and at first re-launch (even after
    Power Pivot Uninstallation) it will try to load Powerpivot add-in and will give an error.
    Downloading file.///c:/Program files (x86)/Microsoft analysis services/AS Excel Client/110/Microsoft.AnalysisServices.XLHost.Addin.VSTO did not succeed.
    this above path is the [InstallDir] which gets wiped off with the unistallation of the .MSI. So, before uninstallation,I stop the excel process and am running a script to delete HKCU Add-in Reg key entries.
    and also, I thought it may be implicitly loading the add-in from folder such as,
    C:\Program Files\Microsoft Office\Office14\XLstart
    %appdata%\Microsoft\Excel\XLSTART
    but nothing is installed there.
    Second Issue
    when I re-install,
    it doesn't automatically show up in the Excel ribbon (even after reboot and even if regeistries are created at the same location) but instead we should add it through COM ADD-IN list in Excel Manually.
    Appreciate any idea's and suggestion's.
    P.S
    is it possible to make it completely installed per system rather having user entries?
    Error Details:
    Name:
    From: file:///C:/Program Files (x86)/Microsoft Analysis Services/AS Excel Client/110/Microsoft.AnalysisServices.XLHost.Addin.vsto
    ************** Exception Text **************
    System.Deployment.Application.DeploymentDownloadException: Downloading file:///C:/Program Files (x86)/Microsoft Analysis Services/AS Excel Client/110/Microsoft.AnalysisServices.XLHost.Addin.vsto did
    not succeed. ---> System.Net.WebException: Could not find a part of the path 'C:\Program Files (x86)\Microsoft Analysis Services\AS Excel Client\110\Microsoft.AnalysisServices.XLHost.Addin.vsto'. ---> System.Net.WebException: Could not find a part of
    the path 'C:\Program Files (x86)\Microsoft Analysis Services\AS Excel Client\110\Microsoft.AnalysisServices.XLHost.Addin.vsto'. ---> System.IO.DirectoryNotFoundException: Could not find a part of the path 'C:\Program Files (x86)\Microsoft Analysis Services\AS
    Excel Client\110\Microsoft.AnalysisServices.XLHost.Addin.vsto'.
       at System.IO.__Error.WinIOError(Int32 errorCode, String maybeFullPath)
       at System.IO.FileStream.Init(String path, FileMode mode, FileAccess access, Int32 rights, Boolean useRights, FileShare share, Int32 bufferSize, FileOptions options, SECURITY_ATTRIBUTES
    secAttrs, String msgPath, Boolean bFromProxy)
       at System.IO.FileStream..ctor(String path, FileMode mode, FileAccess access, FileShare share, Int32 bufferSize, FileOptions options, String msgPath, Boolean bFromProxy)
       at System.Net.FileWebStream..ctor(FileWebRequest request, String path, FileMode mode, FileAccess access, FileShare sharing, Int32 length, Boolean async)
       at System.Net.FileWebResponse..ctor(FileWebRequest request, Uri uri, FileAccess access, Boolean asyncHint)
       --- End of inner exception stack trace ---
       at System.Net.FileWebResponse..ctor(FileWebRequest request, Uri uri, FileAccess access, Boolean asyncHint)
       at System.Net.FileWebRequest.GetResponseCallback(Object state)
       --- End of inner exception stack trace ---
       at System.Net.FileWebRequest.EndGetResponse(IAsyncResult asyncResult)
       at System.Net.FileWebRequest.GetResponse()
       at System.Deployment.Application.SystemNetDownloader.DownloadSingleFile(DownloadQueueItem next)
       --- End of inner exception stack trace ---
       at Microsoft.VisualStudio.Tools.Applications.Deployment.ClickOnceAddInDeploymentManager.GetManifests(TimeSpan timeout)
       at Microsoft.VisualStudio.Tools.Applications.Deployment.ClickOnceAddInDeploymentManager.InstallAddIn()

    Guys, I think I solved the
    issue:
    Symptoms
    1. Power Pivot SQL 2012 32-bit installed over the old version without
    deinstalling it
    2. Installed with a user with administrator rights
    3. It worked under the profile with admin rights, it didn't work under the
    normal users w/o admin rights and threw this error message: Downloading file.///c:/Program files (x86)/Microsoft analysis services/AS Excel Client/10/Microsoft.AnalysisServices.XLHost.Addin.VSTO
    did not succeed.
    4. In the admin profile, it went to the path "110":  C:/Program
    Files (x86)/Microsoft Analysis Services/AS Excel
    Client/110/Microsoft.AnalysisServices.Modeler.FieldList.vsto
    5. In the normal profile, it went to the - wrong - "10" path:
    C:/Program Files (x86)/Microsoft Analysis Services/AS Excel
    Client/10/Microsoft.AnalysisServices.Modeler.FieldList.vsto
    SOLUTION
    1. ADMIN: Installed VSTO 4.0
    2. ADMIN: Checked if the .NET Programmability Support was installed - it was -
    if not, install it!
    3. NORMAL USER: Create a .reg file (Backup your registry before!) and
    use it UNDER THE NORMAL USER!!!
    Windows Registry Editor Version 5.00
    [HKEY_CURRENT_USER\Software\Microsoft\Office\Excel][HKEY_CURRENT_USER\Software\Microsoft\Office\Excel\Addins][HKEY_CURRENT_USER\Software\Microsoft\Office\Excel\Addins\Microsoft.AnalysisServices.Modeler.FieldList]
    "Description"="Microsoft SQL Server PowerPivot for Microsoft Excel"
    "FriendlyName"="PowerPivot for Excel"
    "LoadBehavior"=dword:00000003
    "Manifest"="C:\\Program Files\\Microsoft Analysis Services\\AS
    Excel Client\\110\\Microsoft.AnalysisServices.XLHost.Addin.vsto|vstolocal"
    "CartridgePath"="C:\\Program Files\\Microsoft Analysis
    Services\\AS OLEDB\\110\\Cartridges\\"
    4. NORMAL USER: Rename the registry key
    "HKEY_CURRENT_USER\Software\Microsoft\Office\14.0\User Settings\Microsoft.AnalysisServices.Modeler.FieldList"
    into
    "HKEY_CURRENT_USER\Software\Microsoft\Office\14.0\User
    Settings\Microsoft.AnalysisServices.Modeler.FieldList_old"
    5. NORMAL USER: Start up Power Pivot and it should
    work now!
    Analysis
    IMHO the issue lies in the fact, that the Power Pivot
    installer creates two problems:
    The first issue is that the path to the add-in under
    the NORMAL user is simply wrong and points to a wrong location (the
    "10" in the path). In the admin profile, where it was originally
    installed, it points to the "110" path which is correct.
    The second issue is that the installation procedure
    somehow needs to create a registry key (the one under point 4 in the solution)
    to complete it self and if this key already exists it fails to install and
    throws up weird error messages. If you delete or rename this key, it is created
    again (exactly in the same way) but then everything works out.
    Hope this
    helps!
    Regards, Reto

  • Sending and receivind ADC coefficients from/to soundcard in VBA for Excel 2010

    How to send  and receive ADC coefficients from/to soundcard(mixer,microphone)     in VBA for Excel 2010   (noncom. edition, x64)   to Excel macros for DFT (from IDFT), IIR , user defined samples parser   (special
    noise generator, graphic s(t),S(jw), arg s(jw)    soundcard AFR test ) ?
    What .dll is need for this (without bass.dll)?

    Example from internet :
    'This project needs a module and a form
    'The form must contain two labels, two progressbars, a timer and a checkbox
    'Paste this code into the form
    Dim hmixer As Long ' mixer handle
    Dim inputVolCtrl As MIXERCONTROL ' waveout volume control
    Dim outputVolCtrl As MIXERCONTROL ' microphone volume control
    Dim rc As Long ' return code
    Dim ok As Boolean ' boolean return code
    Dim mxcd As MIXERCONTROLDETAILS ' control info
    Dim vol As MIXERCONTROLDETAILS_SIGNED ' control's signed value
    Dim volume As Long ' volume value
    Dim volHmem As Long ' handle to volume memory
    Private Sub Form_Load()
    Me.ScaleMode = vbTwips
    Me.Caption = "Volume meter"
    Label1.Move 0, 0
    Label1.AutoSize = True
    Label1.Caption = "Input level"
    Label2.Move 0, 4 * Label1.Height
    Label2.AutoSize = True
    Label2.Caption = "Output level"
    ProgressBar1.Move Label1.Width * 2, 0, 3375
    ProgressBar2.Move Label1.Width * 2, Label2.Top, 3375
    Check1.Move ProgressBar1.Left, ProgressBar1.Height
    Check1.Caption = "Get Input"
    Me.Move Me.Left, Me.Top, ProgressBar1.Width + ProgressBar1.Left + 10 * Screen.TwipsPerPixelX, ProgressBar2.Top + ProgressBar2.Height + 30 * Screen.TwipsPerPixelY
    Timer1.Interval = 50
    Timer1.Enabled = True
    ' Open the mixer specified by DEVICEID
    rc = mixerOpen(hmixer, DEVICEID, 0, 0, 0)
    If ((MMSYSERR_NOERROR <> rc)) Then
    MsgBox "Couldn't open the mixer."
    Exit Sub
    End If
    ' Get the input volume meter
    ok = GetControl(hmixer, MIXERLINE_COMPONENTTYPE_DST_WAVEIN, MIXERCONTROL_CONTROLTYPE_PEAKMETER, inputVolCtrl)
    If (ok <> True) Then
    ok = GetControl(hmixer, MIXERLINE_COMPONENTTYPE_SRC_MICROPHONE, MIXERCONTROL_CONTROLTYPE_PEAKMETER, inputVolCtrl)
    End If
    If (ok = True) Then
    ProgressBar1.Min = 0
    ProgressBar1.Max = inputVolCtrl.lMaximum
    Else
    ProgressBar1.Enabled = False
    MsgBox "Couldn't get wavein meter"
    End If
    ' Get the output volume meter
    ok = GetControl(hmixer, MIXERLINE_COMPONENTTYPE_SRC_WAVEOUT, MIXERCONTROL_CONTROLTYPE_PEAKMETER, outputVolCtrl)
    If (ok = True) Then
    ProgressBar2.Min = 0
    ProgressBar2.Max = outputVolCtrl.lMaximum
    Else
    ProgressBar2.Enabled = False
    MsgBox "Couldn't get waveout meter"
    End If
    ' Initialize mixercontrol structure
    mxcd.cbStruct = Len(mxcd)
    volHmem = GlobalAlloc(&H0, Len(volume)) ' Allocate a buffer for the volume value
    mxcd.paDetails = GlobalLock(volHmem)
    mxcd.cbDetails = Len(volume)
    mxcd.cChannels = 1
    End Sub
    Private Sub Check1_Click()
    If (Check1.Value = 1) Then
    StartInput ' Start receiving audio input
    Else
    StopInput ' Stop receiving audio input
    End If
    End Sub
    Private Sub Timer1_Timer()
    On Error Resume Next
    ' Process sound buffer if recording
    If (fRecording) Then
    For i = 0 To (NUM_BUFFERS - 1)
    If inHdr(i).dwFlags And WHDR_DONE Then
    rc = waveInAddBuffer(hWaveIn, inHdr(i), Len(inHdr(i)))
    End If
    Next
    End If
    ' Get the current input level
    If (ProgressBar1.Enabled = True) Then
    mxcd.dwControlID = inputVolCtrl.dwControlID
    mxcd.item = inputVolCtrl.cMultipleItems
    rc = mixerGetControlDetails(hmixer, mxcd, MIXER_GETCONTROLDETAILSF_VALUE)
    CopyStructFromPtr volume, mxcd.paDetails, Len(volume)
    If (volume < 0) Then
    volume = -volume
    End If
    ProgressBar1.Value = volume
    End If
    ' Get the current output level
    If (ProgressBar2.Enabled = True) Then
    mxcd.dwControlID = outputVolCtrl.dwControlID
    mxcd.item = outputVolCtrl.cMultipleItems
    rc = mixerGetControlDetails(hmixer, mxcd, MIXER_GETCONTROLDETAILSF_VALUE)
    CopyStructFromPtr volume, mxcd.paDetails, Len(volume)
    If (volume < 0) Then volume = -volume
    ProgressBar2.Value = volume
    End If
    End Sub
    Private Sub Form_Unload(Cancel As Integer)
    If (fRecording = True) Then
    StopInput
    End If
    GlobalFree volHmem
    End Sub
    'Paste this code into the module
    Public Const CALLBACK_FUNCTION = &H30000
    Public Const MM_WIM_DATA = &H3C0
    Public Const WHDR_DONE = &H1 ' done bit
    Public Const GMEM_FIXED = &H0 ' Global Memory Flag used by GlobalAlloc functin
    Type WAVEHDR
    lpData As Long
    dwBufferLength As Long
    dwBytesRecorded As Long
    dwUser As Long
    dwFlags As Long
    dwLoops As Long
    lpNext As Long
    Reserved As Long
    End Type
    Type WAVEINCAPS
    wMid As Integer
    wPid As Integer
    vDriverVersion As Long
    szPname As String * 32
    dwFormats As Long
    wChannels As Integer
    End Type
    Type WAVEFORMAT
    wFormatTag As Integer
    nChannels As Integer
    nSamplesPerSec As Long
    nAvgBytesPerSec As Long
    nBlockAlign As Integer
    wBitsPerSample As Integer
    cbSize As Integer
    End Type
    Declare Function waveInOpen Lib "winmm.dll" (lphWaveIn As Long, ByVal uDeviceID As Long, lpFormat As WAVEFORMAT, ByVal dwCallback As Long, ByVal dwInstance As Long, ByVal dwFlags As Long) As Long
    Declare Function waveInPrepareHeader Lib "winmm.dll" (ByVal hWaveIn As Long, lpWaveInHdr As WAVEHDR, ByVal uSize As Long) As Long
    Declare Function waveInReset Lib "winmm.dll" (ByVal hWaveIn As Long) As Long
    Declare Function waveInStart Lib "winmm.dll" (ByVal hWaveIn As Long) As Long
    Declare Function waveInStop Lib "winmm.dll" (ByVal hWaveIn As Long) As Long
    Declare Function waveInUnprepareHeader Lib "winmm.dll" (ByVal hWaveIn As Long, lpWaveInHdr As WAVEHDR, ByVal uSize As Long) As Long
    Declare Function waveInClose Lib "winmm.dll" (ByVal hWaveIn As Long) As Long
    Declare Function waveInGetDevCaps Lib "winmm.dll" Alias "waveInGetDevCapsA" (ByVal uDeviceID As Long, lpCaps As WAVEINCAPS, ByVal uSize As Long) As Long
    Declare Function waveInGetNumDevs Lib "winmm.dll" () As Long
    Declare Function waveInGetErrorText Lib "winmm.dll" Alias "waveInGetErrorTextA" (ByVal err As Long, ByVal lpText As String, ByVal uSize As Long) As Long
    Declare Function waveInAddBuffer Lib "winmm.dll" (ByVal hWaveIn As Long, lpWaveInHdr As WAVEHDR, ByVal uSize As Long) As Long
    Public Const MMSYSERR_NOERROR = 0
    Public Const MAXPNAMELEN = 32
    Public Const MIXER_LONG_NAME_CHARS = 64
    Public Const MIXER_SHORT_NAME_CHARS = 16
    Public Const MIXER_GETLINEINFOF_COMPONENTTYPE = &H3&
    Public Const MIXER_GETCONTROLDETAILSF_VALUE = &H0&
    Public Const MIXER_GETLINECONTROLSF_ONEBYTYPE = &H2&
    Public Const MIXERLINE_COMPONENTTYPE_DST_FIRST = &H0&
    Public Const MIXERLINE_COMPONENTTYPE_SRC_FIRST = &H1000&
    Public Const MIXERLINE_COMPONENTTYPE_DST_SPEAKERS = (MIXERLINE_COMPONENTTYPE_DST_FIRST + 4)
    Public Const MIXERLINE_COMPONENTTYPE_SRC_MICROPHONE = (MIXERLINE_COMPONENTTYPE_SRC_FIRST + 3)
    Public Const MIXERLINE_COMPONENTTYPE_SRC_LINE = (MIXERLINE_COMPONENTTYPE_SRC_FIRST + 2)
    Public Const MIXERCONTROL_CT_CLASS_FADER = &H50000000
    Public Const MIXERCONTROL_CT_UNITS_UNSIGNED = &H30000
    Public Const MIXERCONTROL_CT_UNITS_SIGNED = &H20000
    Public Const MIXERCONTROL_CT_CLASS_METER = &H10000000
    Public Const MIXERCONTROL_CT_SC_METER_POLLED = &H0&
    Public Const MIXERCONTROL_CONTROLTYPE_FADER = (MIXERCONTROL_CT_CLASS_FADER Or MIXERCONTROL_CT_UNITS_UNSIGNED)
    Public Const MIXERCONTROL_CONTROLTYPE_VOLUME = (MIXERCONTROL_CONTROLTYPE_FADER + 1)
    Public Const MIXERLINE_COMPONENTTYPE_DST_WAVEIN = (MIXERLINE_COMPONENTTYPE_DST_FIRST + 7)
    Public Const MIXERLINE_COMPONENTTYPE_SRC_WAVEOUT = (MIXERLINE_COMPONENTTYPE_SRC_FIRST + 8)
    Public Const MIXERCONTROL_CONTROLTYPE_SIGNEDMETER = (MIXERCONTROL_CT_CLASS_METER Or MIXERCONTROL_CT_SC_METER_POLLED Or MIXERCONTROL_CT_UNITS_SIGNED)
    Public Const MIXERCONTROL_CONTROLTYPE_PEAKMETER = (MIXERCONTROL_CONTROLTYPE_SIGNEDMETER + 1)
    Declare Function mixerClose Lib "winmm.dll" (ByVal hmx As Long) As Long
    Declare Function mixerGetControlDetails Lib "winmm.dll" Alias "mixerGetControlDetailsA" (ByVal hmxobj As Long, pmxcd As MIXERCONTROLDETAILS, ByVal fdwDetails As Long) As Long
    Declare Function mixerGetDevCaps Lib "winmm.dll" Alias "mixerGetDevCapsA" (ByVal uMxId As Long, ByVal pmxcaps As MIXERCAPS, ByVal cbmxcaps As Long) As Long
    Declare Function mixerGetID Lib "winmm.dll" (ByVal hmxobj As Long, pumxID As Long, ByVal fdwId As Long) As Long
    Declare Function mixerGetLineInfo Lib "winmm.dll" Alias "mixerGetLineInfoA" (ByVal hmxobj As Long, pmxl As MIXERLINE, ByVal fdwInfo As Long) As Long
    Declare Function mixerGetLineControls Lib "winmm.dll" Alias "mixerGetLineControlsA" (ByVal hmxobj As Long, pmxlc As MIXERLINECONTROLS, ByVal fdwControls As Long) As Long
    Declare Function mixerGetNumDevs Lib "winmm.dll" () As Long
    Declare Function mixerMessage Lib "winmm.dll" (ByVal hmx As Long, ByVal uMsg As Long, ByVal dwParam1 As Long, ByVal dwParam2 As Long) As Long
    Declare Function mixerOpen Lib "winmm.dll" (phmx As Long, ByVal uMxId As Long, ByVal dwCallback As Long, ByVal dwInstance As Long, ByVal fdwOpen As Long) As Long
    Declare Function mixerSetControlDetails Lib "winmm.dll" (ByVal hmxobj As Long, pmxcd As MIXERCONTROLDETAILS, ByVal fdwDetails As Long) As Long
    Declare Sub CopyStructFromPtr Lib "kernel32" Alias "RtlMoveMemory" (struct As Any, ByVal ptr As Long, ByVal cb As Long)
    Declare Sub CopyPtrFromStruct Lib "kernel32" Alias "RtlMoveMemory" (ByVal ptr As Long, struct As Any, ByVal cb As Long)
    Declare Function GlobalAlloc Lib "kernel32" (ByVal wFlags As Long, ByVal dwBytes As Long) As Long
    Declare Function GlobalLock Lib "kernel32" (ByVal hmem As Long) As Long
    Declare Function GlobalFree Lib "kernel32" (ByVal hmem As Long) As Long
    Type MIXERCAPS
    wMid As Integer
    wPid As Integer
    vDriverVersion As Long
    szPname As String * MAXPNAMELEN
    fdwSupport As Long
    cDestinations As Long
    End Type
    Type MIXERCONTROL
    cbStruct As Long
    dwControlID As Long
    dwControlType As Long
    fdwControl As Long
    cMultipleItems As Long
    szShortName As String * MIXER_SHORT_NAME_CHARS
    szName As String * MIXER_LONG_NAME_CHARS
    lMinimum As Long
    lMaximum As Long
    Reserved(10) As Long
    End Type
    Type MIXERCONTROLDETAILS
    cbStruct As Long
    dwControlID As Long
    cChannels As Long
    item As Long
    cbDetails As Long
    paDetails As Long
    End Type
    Type MIXERCONTROLDETAILS_SIGNED
    lValue As Long
    End Type
    Type MIXERLINE
    cbStruct As Long
    dwDestination As Long
    dwSource As Long
    dwLineID As Long
    fdwLine As Long
    dwUser As Long
    dwComponentType As Long
    cChannels As Long
    cConnections As Long
    cControls As Long
    szShortName As String * MIXER_SHORT_NAME_CHARS
    szName As String * MIXER_LONG_NAME_CHARS
    dwType As Long
    dwDeviceID As Long
    wMid As Integer
    wPid As Integer
    vDriverVersion As Long
    szPname As String * MAXPNAMELEN
    End Type
    Type MIXERLINECONTROLS
    cbStruct As Long
    dwLineID As Long
    dwControl As Long
    cControls As Long
    cbmxctrl As Long
    pamxctrl As Long
    End Type
    Public i As Integer, j As Integer, rc As Long, msg As String * 200, hWaveIn As Long
    Public Const NUM_BUFFERS = 2
    Public format As WAVEFORMAT, hmem(NUM_BUFFERS) As Long, inHdr(NUM_BUFFERS) As WAVEHDR
    Public Const BUFFER_SIZE = 8192
    Public Const DEVICEID = 0
    Public fRecording As Boolean
    Function GetControl(ByVal hmixer As Long, ByVal componentType As Long, ByVal ctrlType As Long, ByRef mxc As MIXERCONTROL) As Boolean
    ' This function attempts to obtain a mixer control. Returns True if successful.
    Dim mxlc As MIXERLINECONTROLS
    Dim mxl As MIXERLINE
    Dim hmem As Long
    Dim rc As Long
    mxl.cbStruct = Len(mxl)
    mxl.dwComponentType = componentType
    ' Obtain a line corresponding to the component type
    rc = mixerGetLineInfo(hmixer, mxl, MIXER_GETLINEINFOF_COMPONENTTYPE)
    If (MMSYSERR_NOERROR = rc) Then
    mxlc.cbStruct = Len(mxlc)
    mxlc.dwLineID = mxl.dwLineID
    mxlc.dwControl = ctrlType
    mxlc.cControls = 1
    mxlc.cbmxctrl = Len(mxc)
    ' Allocate a buffer for the control
    'hmem = GlobalAlloc(&H40, Len(mxc))
    hmem = GlobalAlloc(GMEM_FIXED, Len(mxc))
    mxlc.pamxctrl = GlobalLock(hmem)
    mxc.cbStruct = Len(mxc)
    ' Get the control
    rc = mixerGetLineControls(hmixer, mxlc, MIXER_GETLINECONTROLSF_ONEBYTYPE)
    If (MMSYSERR_NOERROR = rc) Then
    GetControl = True
    ' Copy the control into the destination structure
    CopyStructFromPtr mxc, mxlc.pamxctrl, Len(mxc)
    Else
    GetControl = False
    End If
    GlobalFree (hmem)
    Exit Function
    End If
    GetControl = False
    End Function
    ' Function to process the wave recording notifications.
    Sub waveInProc(ByVal hwi As Long, ByVal uMsg As Long, ByVal dwInstance As Long, ByRef hdr As WAVEHDR, ByVal dwParam2 As Long)
    If (uMsg = MM_WIM_DATA) Then
    If fRecording Then
    rc = waveInAddBuffer(hwi, hdr, Len(hdr))
    End If
    End If
    End Sub
    ' This function starts recording from the soundcard. The soundcard must be recording in order to
    ' monitor the input level. Without starting the recording from this application, input level
    ' can still be monitored if another application is recording audio
    Function StartInput() As Boolean
    If fRecording Then
    StartInput = True
    Exit Function
    End If
    format.wFormatTag = 1
    format.nChannels = 1
    format.wBitsPerSample = 8
    format.nSamplesPerSec = 8000
    format.nBlockAlign = format.nChannels * format.wBitsPerSample / 8
    format.nAvgBytesPerSec = format.nSamplesPerSec * format.nBlockAlign
    format.cbSize = 0
    For i = 0 To NUM_BUFFERS - 1
    hmem(i) = GlobalAlloc(&H40, BUFFER_SIZE)
    inHdr(i).lpData = GlobalLock(hmem(i))
    inHdr(i).dwBufferLength = BUFFER_SIZE
    inHdr(i).dwFlags = 0
    inHdr(i).dwLoops = 0
    Next
    rc = waveInOpen(hWaveIn, DEVICEID, format, 0, 0, 0)
    If rc <> 0 Then
    waveInGetErrorText rc, msg, Len(msg)
    MsgBox msg
    StartInput = False
    Exit Function
    End If
    For i = 0 To NUM_BUFFERS - 1
    rc = waveInPrepareHeader(hWaveIn, inHdr(i), Len(inHdr(i)))
    If (rc <> 0) Then
    waveInGetErrorText rc, msg, Len(msg)
    MsgBox msg
    End If
    Next
    For i = 0 To NUM_BUFFERS - 1
    rc = waveInAddBuffer(hWaveIn, inHdr(i), Len(inHdr(i)))
    If (rc <> 0) Then
    waveInGetErrorText rc, msg, Len(msg)
    MsgBox msg
    End If
    Next
    fRecording = True
    rc = waveInStart(hWaveIn)
    StartInput = True
    End Function
    ' Stop receiving audio input on the soundcard
    Sub StopInput()
    fRecording = False
    waveInReset hWaveIn
    waveInStop hWaveIn
    For i = 0 To NUM_BUFFERS - 1
    waveInUnprepareHeader hWaveIn, inHdr(i), Len(inHdr(i))
    GlobalFree hmem(i)
    Next
    waveInClose hWaveIn
    End Sub
    Error if using winmm.dll, kernel32  in x64 mode 

  • Support for Excel 2010?

    At what point does Oracle plan to add support for Excel 2010 (including 64 bit) to IOP?
    11.1.2.0 supports Excel 2003 SP1 and Excel 2007.
    Thank you.

    It will be supported in future release and we dont have specific dates or releases yet.

  • "Rows to Repeat at top" Not Available in Excel 2010

    Hello, All!
    Here I am with another question... Maybe someday when I grow up, I'll be able to
    answer a few questions! ;-{)
    I am creating a PDF via Adobe Acrobat Professional 9 and Excel 2010 and want to have the title row appear on the top of each of the 140+ pages, but when I go to the
    Page Setup and select the Sheet Tab, the
    Rows to repeat at top is unavailable.
    Excel was fully installed as part of Office Professional Plus 2010 and Acrobat was fully installed as part of Adobe Design CS4.
    Thanks in advance for your help!

    Hi,
    Based on my research,
    if you have more than one worksheet selected, the
    Rows to repeat at top and Columns to repeat at left
    boxes are not available in the Page Setup dialog box. To cancel a selection of multiple worksheets, click any unselected worksheet. If no unselected sheet is visible, right-click the tab of a selected sheet, and then click
    Ungroup Sheets on the shortcut menu.
    Quote from:
    http://office.microsoft.com/en-us/excel-help/repeat-specific-rows-or-columns-on-every-printed-page-HA010342842.aspx
    Jaynet Zhang
    TechNet Subscriber Support
    If you are
    TechNet Subscription user and have any feedback on our support quality, please send your feedbackhere.

  • VB UI builder, RAD, CASE Wizard for creating macro for Excel 2010?

    Hello, I wonder if it is available a: rad, case, UI, framework, application wizard that using VBA as its engine may easy the process to create a macro excel 2010; here the link: https://www.dropbox.com/s/62r5wwgf0ziy5ht/sheet.xlsm to the sheet for an example
    of what I mean. It is not about a macro recorder task; it is not interactive. Thank you.
    Regards, Giuseppe

    Thank you for your interest, this is another link for the same file: http://www.adrive.com/public/rBdrRn/sheet.xlsm
    Regards,
    Giuseppe

  • Power Map Locations for Canadian Postal Codes showing incorrectly

    I see great potential in the possibilities of using Power Map. However the location for one Canadian postal code is showing incorrectly on the resulting map. I have verified that the postal code itself is correct and my data has been entered correctly and
    it is below:
    N6K 0B3
    It is showing nowhere near where it is supposed to be. Users of the application have to have confidence that the mapping behind it is correct. I need to create maps for each poll for volunteers to retrieve
    the signs post-election and don't want to send them to the wrong locations.
    By the way, why is my font size changing if I modify the text in my post?
    Thanks,
    Lila

    Ahh Geolocations are fun, aren't they!
    Bing maps is showing N6K 0B3 as just south west of London, ON. Google maps shows it north of there, West of London. If Bing is not correct, you'd need to request a fix from Bing/Microsoft.
    While you wait for that, you'd have to create your own kludge to correct it:
    CASE WHEN postcode = 'N6K 0B3' THEN geography::Point(-81.437296,43.0041629,4326) ELSE bingsGeospatial as geoPoint
    I was in talks with Canada Post regarding acquiring their geo location data for post codes a while ago. You can get a product from them for about 7500 a year. I was rather disappointed to find they only provided points, and not bounding boxes (as google
    maps does).

  • Commondialog for excel 2010 - 64 bits

    No puedo usar el commondialog en excel 2010 con plataforma de 64 bits. Ya registre el ocx en  ''regsvr32 c:\Windows\SysWOW64\comdlg32.ocx'' ......... pero sigo sin poder usarlo. Tengo insertado un commondialog en un excel anterior y cuando lo abro en
    2010 me lo marca con una X.
    No se como solucionarlo, si alguien me puede ayudar, desde muchas gracias 

    Hi,
    Thanks for posting in MSDN forum.
    This forum is discussing developing issues using English. To get more effective response, I suggest that you translate it using English.
    In addition, it seem the issue relative to the dialog in Excel, however I am not able to understand it exactly.
    As far as I know, we can use
    Application.Dialogs to show the build-in dialog in Excel. Also here are some useful links about this topic:
    Built-In Dialog Box Argument Lists
    How to: Create a Custom Dialog Box
    Displaying a Custom Dialog Box
    Hope it is helpful.
    Regards & Fei
    We are trying to better understand customer views on social support experience, so your participation in this interview project would be greatly appreciated if you have time. Thanks for helping make community forums a great place.
    Click
    HERE to participate the survey.

  • Unable to create a PivotChart in PowerPivot for Excel 2010

    I am unable to create a PivotChart from the PowerPivot window. It does not create a Chart# sheet nor does it appear as a PivotChart on the PivotTable worksheet in Excel. There is not even a PivotChart grid and Field List to create the PivotChart from.
    Help. Please and thank you.
    [email protected]

    Any ideas why this might be happening for Ed?
    Thanks!
    Ed Price, Azure & Power BI Customer Program Manager (Blog,
    Small Basic,
    Wiki Ninjas,
    Wiki)
    Answer an interesting question?
    Create a wiki article about it!

  • MAPI.Session for Office 2010

    Hi all,
    This code works fine in office 2003 but not in office 2010  (Raise NO_MAPI).
    Do you have an idea ?
    CREATE OBJECT SESSION 'MAPI.Session'.
        IF SY-SUBRC NE 0.
          RAISE NO_MAPI.
      ENDIF.
    Now log into the session with the given profile
      CALL METHOD OF SESSION 'LOGON'
      EXPORTING #1 = OUTLOOK_PROFILE    "Outlook_Profile as String,  (opt)
                #2 = PROFILE_PASSWORD   "profile_Password as String, (opt)
                #3 = SHOW_DIALOG        "showDialog as Boolean,      (opt)
                #4 = NEW_SESSION        "newSession as Boolean,      (opt)
                #5 = 0                  "parentWindow as Long,       (opt)
                #6 = 1                  "NoMail as Boolean,          (opt)
              #7 = ' '                "ProfileInfo as String,      (opt)
      IF SY-SUBRC NE 0.
        RAISE NO_EMAIL_SENT.
      ENDIF.
    Regards,
    Thierry
    Edited by: Thierry CHIRET on Jun 10, 2011 4:24 PM

    Hi,
    Who is that vendor? What did they tell you in detail?
    In this forum we mainly discuss technical questions about Office products, for the purchase and activation questions, I suggest you contact your local customer service.
    You should be able to find your local customer service number from this link:
    https://support.microsoft.com/en-us/gp/customer-service-phone-numbers/en-us?wa=wsignin1.0
    Regards,
    Melon Chen
    TechNet Community Support
    It's recommended to download and install
    Configuration Analyzer Tool (OffCAT), which is developed by Microsoft Support teams. Once the tool is installed, you can run it at any time to scan for hundreds of known issues in Office
    programs. Please remember to mark the replies as answers if they help, and unmark the answers if they provide no help. If you have feedback for TechNet Support, contact
    [email protected]

  • Why isn't turn by turn and 3d maps available for iPhone 4?

    It seems disgraceful to think updates are already forgetting the 4

    Try calling Apple Customer Relatioons at 800-767-2775 and discussing your problems with them.

  • Power Map in Excel 2013

    I have recently managed to persuade my company to provide me with a standalone copy of Excel 2013 so that I can use the functionality provided by Power Map Preview for Excel 2013. This is despite the fact that the company currently standardises on Excel
    2007. I have had the product installed and activated and it also appears to recognize the Power Map Add on, however the Power Map button remain greyed out. There is nothing to suggest that this version of Excel is incompatible with Power Map Preview however
    I cannot get it to work. Any suggestions would be gratefully received. _thanks

    Hi,
    As far as I know, Power Map Preview is available in the Office Professional Plus and Office 365 Professional Plus editions, and in the standalone edition of Excel 2013.
    And make sure we have enable the Add-in. Go file tab> Options> Add-ins> Com add-ins> Check Power view.
    Then, please we need to drag a geographic field such as Country/Region, State/Province, or City to the Power View sheet or view to create a table.
    If we do not choose the filed, the map button is greyed out.
     Tip    A geographic field might be marked with a small globe icon. This identifies it as a geographic field.
    Drag a numeric field such as Sales to the table.
    On the Design tab, click Map.
    Click Enable Content to send the data to Bing for geocoding through a secured web connection.
    Power View creates a map with a dot for each value, such as each city. The size of the dot represents the value.
    To convert the dots to pie charts, add a category field to the Color box for the map.
    http://office.microsoft.com/en-gb/excel-help/maps-in-power-view-HA103005792.aspx
    If the Power Map still does not work, please try to install the update to fix it.
    http://support.microsoft.com/kb/2817425/en-us
    Regards,
    George Zhao
    TechNet Community Support

  • Power Map in Excel 2013 (Office 2013 Professional Plus) will not show up in ribbon

     I have tried literally everything and nothing works.
    I can download the preview version of the Powermap addin and it works.
    But by default the add-in will not show up in the ribbon.
    I uninstalled , reinstalled, re-ran SP1 of office 2013. double checked the load behaviour,
    ran a repair.. nothing works.
    Powerview displays fine, Bing Maps... just not Power Map

    Hi Kenneth,
    Since you are using Office 2013 Professional Plus, you can only use Power Map Preview for Excel 2013, which is an unsupported add-in. See:
    https://support.office.com/en-in/article/Power-Map-for-Excel-82d65bd7-70c9-48a3-8356-6b0e82472d74
    Regards,
    Steve Fan
    TechNet Community Support
    It's recommended to download and install
    Configuration Analyzer Tool (OffCAT), which is developed by Microsoft Support teams. Once the tool is installed, you can run it at any time to scan for hundreds of known issues in Office
    programs.
    Please remember to mark the replies as answers if they help, and unmark the answers if they provide no help. If you have feedback for TechNet Support, contact
    [email protected]

  • Power Map is not shown in the Ribbon

    I have seen similar questions before, but many updates has happened for Power Map from last year when that question was asked. So sure if it is still the same situation.
    https://social.technet.microsoft.com/Forums/en-US/2480e2d8-a75d-4a80-a8d6-71cf5be97bf4/power-map-addin-enabled-but-no-ribbon-shortcut?forum=powermap
    Basically, I installed Microsoft Office 2013 Professional Plus, I enabled Power Pivot, Power View and Power Map, all of them are shown as active under "Excel Options" after you open "File"-"Options"-"Add-Ins". But
    only Power Pivot and Power View is shown in the Ribbon. Power Map is supposed to show under "Insert"-"Tours", just next to "Power View"(Please see example).  It is NOT there.
    http://office.microsoft.com/en-001/excel-help/i-don-t-see-the-power-map-button-in-excel-HA104091292.aspx?CTT=5&origin=HA104091224
    I tried uninstall Office and Install it again. I also checked that it is the most recent version (as now 15.0.4659.1001), I checked LoadBehavior in Registry Editor, the value is 3.  But I do find that for Power Pivot and Power View,
    there are four values((Default), Description, FriendlyName, LoadBehavior), for Power Map, there are only two ((Default), LoadBehavior). However I tried to create (Description, FriendlyName) for Power Map in Registry Editor, it's still not working. I later
    tried to use repair office from "Control Pannel"-"Programs and Features" it's still not working.
    I might be Rookie on Power Map and there might already be solutions widely known among profesionals. I really appreciate if professionals can help me to fix that. Considering I spend much more money just to get functions of Power Map addins.
    if this is truely a bug in Map Power, I hope Microsoft would be awared of this.
    Thank you

    Hi,
    Since you have Microsoft Office Professional Plus 2013 installed in your PC, you need download and use the Power Map Preview for Excel 2013 as an unsupported add-in.
    http://www.microsoft.com/en-us/download/details.aspx?id=38395
    A new preview version that replaces the earlier preview is available on the Download Center page. The earlier version of the Power Map Preview is expired, and won't work with any version of Excel. If you have the earlier version, uninstall it from Control
    Panel, then download and install the current version of the Power Map Preview.
    https://support.office.com/en-us/article/Power-Map-for-Excel-82d65bd7-70c9-48a3-8356-6b0e82472d74
    Best regards,
    Greta Ge
    TechNet Community Support
    It's recommended to download and install
    Configuration Analyzer Tool (OffCAT), which is developed by Microsoft Support teams. Once the tool is installed, you can run it at any time to scan for hundreds of known issues in Office
    programs.

Maybe you are looking for