synthesizer-midi-0.6.1: Render audio signals from MIDI files or realtime messages

Safe HaskellNone
LanguageHaskell2010

Synthesizer.MIDI.Generic

Description

Convert MIDI events of a MIDI controller to a control signal.

Synopsis

Documentation

replicateLong :: Write sig y => StrictTime -> y -> sig y Source #

piecewiseConstant :: Write sig y => T StrictTime y -> sig y Source #

piecewiseConstantInit :: Write sig y => y -> T StrictTime y -> sig y Source #

piecewiseConstantInitWith :: Write sig c => (y -> c) -> c -> T StrictTime [y] -> sig c Source #

type Instrument y signal = y -> y -> LazyTime -> signal Source #

type Bank y signal = Program -> Instrument y signal Source #

renderInstrument :: C y => Bank y signal -> Note -> signal Source #

Instrument parameters are: velocity from -1 to 1 (0 is the normal pressure, no pressure aka NoteOff is not supported), frequency is given in Hertz

renderInstrumentIgnoreProgram :: C y => Instrument y signal -> Note -> signal Source #

flatten :: (Monoid signal, C time) => T time [signal] -> T time signal Source #

Turn an event list with bundles of elements into an event list with single events. ToDo: Move to event-list package?

applyModulation :: (Transform signal, NormalForm signal) => signal -> Modulator (signal -> instr, note) (instr, note) Source #

evaluateVectorHead :: NormalForm signal => signal -> t -> t Source #

We have to evaluate the head value at each drop in order to avoid growing thunks that lead to a space leak.

type FilterSequence event signal = Filter event (T ShortStrictTime signal) Source #

data Modulator note signal Source #

The state action for the time should just return the argument time. However we need this time (or alternatively another result type) for triggering the drop in advanceModulationChunk. Without this strict evaluation, the drop will be delayed until the control curve is actually needed.

Constructors

Modulator state (StrictTime -> State state StrictTime) (note -> State state signal) 

Instances

Arrow Modulator Source # 

Methods

arr :: (b -> c) -> Modulator b c #

first :: Modulator b c -> Modulator (b, d) (c, d) #

second :: Modulator b c -> Modulator (d, b) (d, c) #

(***) :: Modulator b c -> Modulator b' c' -> Modulator (b, b') (c, c') #

(&&&) :: Modulator b c -> Modulator b c' -> Modulator b (c, c') #

Category * Modulator Source # 

Methods

id :: cat a a #

(.) :: cat b c -> cat a b -> cat a c #

sequenceCore :: (C event, Monoid signal) => Channel -> Program -> Modulator Note signal -> FilterSequence event signal Source #

sequence :: (C event, Monoid signal, C y) => Channel -> Instrument y signal -> FilterSequence event signal Source #

sequenceModulated :: (C event, Transform ctrl, NormalForm ctrl, Monoid signal, C y) => ctrl -> Channel -> (ctrl -> Instrument y signal) -> FilterSequence event signal Source #

sequenceMultiModulated :: (C event, Monoid signal, C y) => Channel -> instrument -> Modulator (instrument, Note) (Instrument y signal, Note) -> FilterSequence event signal Source #

sequenceMultiProgram :: (C event, Monoid signal, C y) => Channel -> Program -> [Instrument y signal] -> FilterSequence event signal Source #

sequenceModulatedMultiProgram :: (Transform ctrl, NormalForm ctrl, C event, Monoid signal, C y) => ctrl -> Channel -> Program -> [ctrl -> Instrument y signal] -> FilterSequence event signal Source #