Voiceover recording from Firewire Soundcard

Hi All,
I've read most posts concerning voiceover recording but none describe my problem. I would like to use my Alesis firewire IO26 external sound card with a generic microphone. In every single program the device registers and is able to record from the microphone, except in Imovie '11. The device registers but there's no signal.
Is this a bug? Has anyone had this before problem....?
Thanks

I gues I should've tried this before posting but I just recorded a little voiceover in FCP and that works like charm (same setup).
The reason I'm not using FCP for the entire project is that my mom edited our holiday video in Imovie and I would like to finish it there. Even if i wanted to finish the project in FCP it would not be possible because the timeline will not convert correctly to FCP.
So the problem remains that iMovie will not let me record a voiceover.

Similar Messages

  • 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 

  • Recording audio from firewire video source

    What does it take for Soundbooth (or more specifically OS X) to recognize firewire video as an audio source?
    I have a video conversion box that accepts analog video/audio input and connects via firewire to my MacBookPro. I can use that to capture video with Premiere or OnLocation, and extract the audio from that, but in the event I'm just converting an audio source, I'd like to use the same box to capture audio directly to Soundbooth. But 'Audio MIDI Setup' shows only built-in input and a USB audio source.
    Otherwise I either have to use built-in audio input (normally not available because I have external speakers plugged in), or get a USB or firewire audio interface. I'll probably do that eventually but was hoping for a software solution of some sort.

    You should look into WireTap Studio from Ambrosia software. It will record ANYTHING at all that goes through your sound card, regardless of the original source. I know, "If I paid for SoundBooth, why should I go buy another piece of software?"
    I've used Wiretap since 2002 when it was still a freebie. It's gotten a lot better in eight years, and when you see everything you can do with it (like recoding streaming audio from the web, or podcasts, getting soundbytes from DVDs, or recording from your TV or even live with a mic) you'll agree that it's another $69, but $69 well spent.
    I used Wiretap to convert more than 1400 cassettes into mp3. I've also pulled songs from movies that are unavailable anywhere. I've recorded live TV audio. You have a multitude of format and quality choices for recording and saving.

  • A.A. 3.0./ Want to Record from Soundcard1 and listen from another Soundcard

    Hiho,
    I Got 2 Soundcards which are installed. a Terratec Phase 22 Recording Soundcard (1) and a Creative Soundblaster Xtreme Music (2).
    It would be nice if Adobe Audition 3.0 would give me the Sound of the Creative Soundcard but Record from the Terratec Soundcard. The problem is that if i choose the Terratec ASIO driver Adobe takes away any option to use the Creative Soundcard. If i use the Creative driver, the Terratec Soundcard isnt displayed anymore.
    2 Screenshots to understand what i mean:
    http://www.imagebanana.com/view/spxtl4y4/1.JPG
    http://www.imagebanana.com/view/ewb5z15z/2.JPG
    http://www.imagebanana.com/view/x79ora17/creativeasio.JPG
    help would be great. please excuse my bad english, like you see at the Screenshots im from Germany.

    ASIO can only use one sound device - that's an ASIO system limitation, not an Adobe one. The only way around this is to use an ASIO to WDM converter, and the only one that's usable in this context is ASIO4ALL, which fortunately for you, is free. At least this way, you will see both cards as being available, but there is a limitation in that you will only get whatever inputs and outputs are available via WDM, and this is often limited to a stereo pair per device.

  • Help! How do I record from my ipad (4th gen) soundcard?

    Hello there everyone,
    I would greatly appreciate some help with this problem ...I want to record from the DUBPAD app but there is no recording feature. ***** huh! I was hoping for some advice on what app to get to record directly from the soundcard so I can use the samples in GarageBand.
    Thanks in advance!
    Melanie

    Um...this is the iMac forum, and it appears your question concerns using your iPad. I would suggest you post your question in the iPad forum.
    Here's a link for you:
    https://discussions.apple.com/community/ipad/using_ipad

  • Firewire soundcards and digital in's.

    Can somebody recomend a good firewire soundcard with a digital in?
    I'm using a Boss BR-532 for its excellent sound quality, but it precedes the models with USB so the only way to get my tracks into Garageband is through a SmartMedia card reader. Just a little time consuming and inconvenient when recording.
    The BR-532 has a digital out.
    So I'm hoping to send the signal from the BR to the Firewire soundcard and then into the G4. (Which btw doesn't have an audio input )

    bummer about no replies.
    the only thing i can add:
    check your manual to make sure that the signal that comes from the digital out is the type you need or expected. it might only be a two channel mix.
    other than that, i'm not sure about digital ins on firewire devices. my guess is some of the higher end models will have them: m-audio firewire 1814, presonus firepod. but i'm not sure.
    it seems like some of us got stuck in the transition from 4track tapes to computers. it wasn't an easy, smooth or speedy switch by any means.
    good luck. have fun!
    brandon

  • Recording from vcr

    My 17 in G4 powerbook has svideo which allows me to watch movies on my tv. Question is, is this svideo conection in and out? I'd like to use it to record from my VCR to digitize some of my older vhs footage.
    Peter

    I've converted VHS movies into a digital format. The easiest way to to that is to get an analog to digital converter box. I have an older version of http://desktop.grassvalley.com/products/ADVC55/index.php which works just fine with my Powerbook. They also make additional models with more features. If you have a video camera that allows an RCA input with a Firewire output, I'd guess that would also work.
    The easiest way to do it is to use the iMovie application, then use iDvd to create a DVD. If you get into it, you may find some limitations in iMovie and iDvd, in which case Final Cut Express would be a good step up.

  • Recording from Mic Truncated

    Hi,
    I'm recording from a mic into a memory buffer. All works fine, except that it always cuts off the last second even though I believe I'm properly draining the target data line before closing it.
    I've tested with the AudioRecorder and SimpleAudioRecorder from the [url http://www.jsresources.org/examples/audio_playing_recording.html]JResources examples and a few other [url http://www.quadmore.com/swingrecorder/]examples out there. They seems to suffer from the same issue.
    Is this just a matter of some sort of latency when the recording is shut down?
    Here are the controlling methods for my recorder.
    public void startRecording()
       state_ = State.RUNNING;
       line_.start();
       thread_ = new Thread()
          public void run()
             recordLoop();
       thread_.start();
    private void recordLoop()
       while(state_ != State.STOPPED)
          int bytesRecorded = line_.read(block_, 0, blockSize_);
          if(bytesRecorded != 0)
             out_.write(block_, 0, bytesRecorded);
    public void stopRecording() throws Exception
       line_.stop();
       line_.drain();
       state_ = State.STOPPED;
       thread_.join();
    }I'm running jdk 1.6.0_22-b04 on Windows XP.
    Thanks for any ideas!!!

    windroid wrote:
    Seems to work so I'm happy. Maybe its specific to my recording setup?Ummmm, the "one second" is probably specific to your recording setup... but I would imagine there is a delta_t associated with starting a recording and the recording starting.
    I'd imagine the TDL drain should handle that, but if there's like a hardware buffer on the soundcard that Java just doesn't have permission to flush... then you'd have to handle that yourself as you have. If the soundcare or the OS is doing some real-time transcoding to give JavaSound data in the format it wants, for instance, there could be a hidden unflushable buffer...

  • Recording from a turnta

    I would like to record from a turntable. What hardware and software do I need?

    I record from tape and turntable regularily but have not used the input of my SoundBlaster since I got my JB and then replaced it with JB3. Using the JB3 is simple and very convenient! with options to record to mp3 at various CBR bit rates or to wav at various sampling frequencies. I choose 44.kHz wav and usually add +dB of gain in the JB3. Once the wavs are completed, I move them to my PC which is fast via firewire, then use Audacity http://audacity.soungforge.net to split up the individual tracks. I name each Artist - Album - # - track, 2, 3 etc encode to mp3, and then use the SuperTagging feature of Music Match Juke Box to fill in the tags, providing track titles, year of release and the cddb genre, which I edit later.
    I am one of the lucky ones with most of my LP's still in pristine condition so do not worry too much about pops and ticks (from that pizza in 973) etc.
    jake

  • Recording from mic

    how do i record from a microphone.
    I want to record from a microphone and play it later how do I go about it

    windroid wrote:
    Seems to work so I'm happy. Maybe its specific to my recording setup?Ummmm, the "one second" is probably specific to your recording setup... but I would imagine there is a delta_t associated with starting a recording and the recording starting.
    I'd imagine the TDL drain should handle that, but if there's like a hardware buffer on the soundcard that Java just doesn't have permission to flush... then you'd have to handle that yourself as you have. If the soundcare or the OS is doing some real-time transcoding to give JavaSound data in the format it wants, for instance, there could be a hidden unflushable buffer...

  • Recording from external source

    I am brand new to Mac / switched from pc a week ago. not able to figure out some things yet and havent found answers in support. mostly on the basic stuff. like I was able to record audio from a lp turntable on a pc. it looks like there is no recording program built in to the iMac, or am I wrong? will I have to purchase some type of software to record from external record or tape source?

    Sorry some heavy-handed moderation has been going on here. I accidently duplicated my post when I edited it to say 'Welcome to Apple Discussions'. Then I asked the mods to remove the first post above and they've gone and deleted my second post and yours; I am sorry about that. 
    You posed a question about Real Instruments in the absent post. A Real Instrument can be a microphone input or any device that connects to the Audio-In port (or a USB/Firewire Audio device).
    Hope that helps.
    mrtotes

  • Recording from DVD to iMovie.

    Can I record from a DVD recorder/player either NTSC or PAL subject matter tranfered to a DVD into iMovie. This is not copyright material, but my own NTSC VHS tapes transfered to DVD. Do I need a converter box? What is the video format? Is this a possibiltity? I only have firewire in to the MAC. How do I do it?

    Hello Alaner,
    you don't need a converter box (although it's a possibility) but you can get the video off your DVD on your mac, converting it into something iMovie can handle
    check out Dan Slagle's Unofficial iMovie FAQ
    Using Mpeg (DVD) footage
    http://danslagle.com/mac/iMovie/tips_tricks/6010.shtml
    helpful tools:
    MPEG StreamClip:
    http://www.apple.com/downloads/macosx/video/mpegstreamclip.html
    Apple MPEG2 PlayBack:
    http://www.apple.com/quicktime/mpeg2/
    DVDxDV
    http://www.dvdxdv.com/
    hope this helps
    mish

  • What is the best way to record a project to an external recorded via firewire. Also, who makes a recorder that works with a mac?

    What is the best way to record a project from the timeline to an external recorder via firewire? Also, who makes a recorder that works with a mac and recordes in realtime? This is possible right?

    While theoretically possible, sometimes the camera people disable recording back to tape from the computer due to DRM (digital rights managment) issues. They will allow tape to tape transfers however.
    Test your process first is all I can advise.
    x

  • Looking to record from tv to Mac mini

    Im looking to record from my tv to my Mac Mini, in a TiVo type way. How would i go about doing this and im sure there is a device i would have to use via usb or firewire. Thanks.

    Hello,
    There isn't really a one-stop solution for the Mac Mini yet. So, you can't just run to your Apple dealer and purchase everything in a single kit and go home and plug it in.
    But, there are many ways to get the end-result you want. Here are some articles that should give you a really good start in picking out what you need:
    http://www.engadget.com/2005/01/25/how-to-turn-your-mac-mini-into-a-media-center /
    http://www.snapstream.com/community/articles/macmini/default.asp
    http://www.anandtech.com/mac/showdoc.aspx?i=2349
    http://www.byopvr.com/displayarticle565.html
    I hope this helps.

  • No Audio or MIDI using Focusrite Saffire Pro 24 DSP Firewire soundcard

    I installed the latest version of Mixcontrol, all my motherboard drivers and BIOS etc are up to date. No problems reported by Device Manager. I've emailed Focusrite about this, but still waiting for a reply. I've tried reinstalling everything, but still
    no joy.
    I've tried various apps such as Reaper, MIDIOX, Traktor and Windows Media Player. None of them play audio or show any sign of MIDI activity even though Reaper and MIDIOX both recognize the Saffire MIDI device. Traktor doesn't recognize it at all.

    Hi ,
    First of all ,did the device work correctly previously? If it is the first time to work with this device, I recommend you refer to the Saffire Pro 24 DSP Firewire
    soundcard user manual to check the configuration of the device.
    1. If it worked correctly previously, you can try the built-in troubleshooting tools to check and repair any problems found with the device connected to the pc. To
    open  the tools:
    Action center\troubleshooting\View all(left corner)\Playing Audio ,Hardware and Devices.
    2.If issue persists, I recommend you update the Audio driver.  If this failed , you may need to uninstall the Audio driver and install the driver from the manufacture
    website.
    3.If the problem persists, here is a link for you to check online:
    Automatically diagnose and fix Windows audio playback problems
    http://support2.microsoft.com/mats/audio-playback-windows-8/en-us
    If all the steps above won`t work, I recommend you check the issue of the Saffire MIDI device.
    Best regards

Maybe you are looking for

  • Windows 8 recovery and licence question

    Hi guys, I have got an Lenovo G50-30 notebook and I've ordered recovery discs thru phone support line. I got 5 discs and I have issue with this recovery. On first disc I need to choose language and region and there is no polish language (notebook is

  • Photo size for iWeb

    I know the photos are resized for Mobile Me, but are they resized when uploaded for an iWeb album? My finished jpg's are quite large and wondering if I need to resize them first or if the program will change them enough to save on space. Thanks, Sue

  • UCCE 10.5 teamadmin doesn't work

    Hello, It is a UCCE 10.5 After upgrade the link http://<PG>:8088/teamadmin/main.cda doesn't work. But I want change workflow team for my agents, how I can do that? Thank you in advance.

  • Video import frustrations

    I figured out the export settings in Quicktime Pro (and Compressor) to get the iPad to recognize my videos at 720p (1280x720, 30fps, .h264, etc.) But I have this one video that simply will not work, and the maddening thing is, it worked perfectly whe

  • Presenter 8 -- need help with proper settings to allow quiz retake (with a NEW set of questions from a random pool)

    We are publishing a Presenter 8 quiz to an LMS in a SCORM format.  I am having trouble with the following:  the quiz is built with multiple question groups, and a limited number of questions are being selected from each group.  E.g. we have 80+ quest