Safe Haskell | None |
---|---|
Language | Haskell98 |
- aftouch :: Sig
- chanctrl :: D -> D -> Sig
- ctrl14 :: D -> D -> D -> D -> D -> Sig
- ctrl21 :: D -> D -> D -> D -> D -> D -> Sig
- ctrl7 :: D -> D -> D -> D -> Sig
- ctrlinit :: [D] -> SE ()
- initc14 :: D -> D -> D -> D -> SE ()
- initc21 :: D -> D -> D -> D -> D -> SE ()
- initc7 :: D -> D -> D -> SE ()
- massign :: D -> D -> SE ()
- midic14 :: D -> D -> D -> D -> Sig
- midic21 :: D -> D -> D -> D -> D -> Sig
- midic7 :: D -> D -> D -> Sig
- midictrl :: D -> Sig
- notnum :: Msg -> D
- pchbend :: Msg -> Sig
- pgmassign :: D -> D -> SE ()
- polyaft :: D -> Sig
- veloc :: Msg -> D
- nrpn :: Sig -> Sig -> Sig -> SE ()
- outiat :: D -> D -> D -> D -> SE ()
- outic :: D -> D -> D -> D -> D -> SE ()
- outic14 :: D -> D -> D -> D -> D -> D -> SE ()
- outipat :: D -> D -> D -> D -> D -> SE ()
- outipb :: D -> D -> D -> D -> SE ()
- outipc :: D -> D -> D -> D -> SE ()
- outkat :: Sig -> Sig -> Sig -> Sig -> SE ()
- outkc :: Sig -> Sig -> Sig -> Sig -> Sig -> SE ()
- outkc14 :: Sig -> Sig -> Sig -> Sig -> Sig -> Sig -> SE ()
- outkpat :: Sig -> Sig -> Sig -> Sig -> Sig -> SE ()
- outkpb :: Sig -> Sig -> Sig -> Sig -> SE ()
- outkpc :: Sig -> Sig -> Sig -> Sig -> SE ()
- ampmidi :: Msg -> D -> D
- ampmidid :: D -> D -> Sig
- cpsmidi :: Msg -> D
- cpsmidib :: Msg -> Sig
- cpstmid :: Msg -> Tab -> D
- octmidi :: Msg -> D
- octmidib :: Msg -> Sig
- pchmidi :: Msg -> D
- pchmidib :: Msg -> Sig
- midiin :: (Sig, Sig, Sig, Sig)
- midiout :: Sig -> Sig -> Sig -> Sig -> SE ()
- midiout_i :: D -> D -> D -> D -> SE ()
- release :: Sig
- xtratim :: D -> SE ()
- midion :: Sig -> Sig -> Sig -> SE ()
- midion2 :: Sig -> Sig -> Sig -> Sig -> SE ()
- moscil :: Sig -> Sig -> Sig -> Sig -> Sig -> SE ()
- noteoff :: D -> D -> D -> SE ()
- noteon :: D -> D -> D -> SE ()
- noteondur :: D -> D -> D -> D -> SE ()
- noteondur2 :: D -> D -> D -> D -> SE ()
- midichannelaftertouch :: Sig -> SE ()
- midichn :: D
- midicontrolchange :: Sig -> Sig -> SE ()
- mididefault :: Sig -> Sig -> SE ()
- midinoteoff :: Sig -> Sig -> SE ()
- midinoteoncps :: Sig -> Sig -> SE ()
- midinoteonkey :: Sig -> Sig -> SE ()
- midinoteonoct :: Sig -> Sig -> SE ()
- midinoteonpch :: Sig -> Sig -> SE ()
- midipitchbend :: Sig -> SE ()
- midipolyaftertouch :: Sig -> Sig -> SE ()
- midiprogramchange :: Sig -> SE ()
- mclock :: D -> SE ()
- mrtmsg :: D -> SE ()
Input.
Get the current after-touch value for this channel.
kaft aftouch [imin] [, imax]
csound doc: http://csound.com/docs/manual/aftouch.html
chanctrl :: D -> D -> Sig Source #
Get the current value of a MIDI channel controller.
Get the current value of a controller and optionally map it onto specified range.
ival chanctrl ichnl, ictlno [, ilow] [, ihigh] kval chanctrl ichnl, ictlno [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/chanctrl.html
ctrl14 :: D -> D -> D -> D -> D -> Sig Source #
Allows a floating-point 14-bit MIDI signal scaled with a minimum and a maximum range.
idest ctrl14 ichan, ictlno1, ictlno2, imin, imax [, ifn] kdest ctrl14 ichan, ictlno1, ictlno2, kmin, kmax [, ifn]
csound doc: http://csound.com/docs/manual/ctrl14.html
ctrl21 :: D -> D -> D -> D -> D -> D -> Sig Source #
Allows a floating-point 21-bit MIDI signal scaled with a minimum and a maximum range.
idest ctrl21 ichan, ictlno1, ictlno2, ictlno3, imin, imax [, ifn] kdest ctrl21 ichan, ictlno1, ictlno2, ictlno3, kmin, kmax [, ifn]
csound doc: http://csound.com/docs/manual/ctrl21.html
ctrl7 :: D -> D -> D -> D -> Sig Source #
Allows a floating-point 7-bit MIDI signal scaled with a minimum and a maximum range.
idest ctrl7 ichan, ictlno, imin, imax [, ifn] kdest ctrl7 ichan, ictlno, kmin, kmax [, ifn] adest ctrl7 ichan, ictlno, kmin, kmax [, ifn] [, icutoff]
csound doc: http://csound.com/docs/manual/ctrl7.html
ctrlinit :: [D] -> SE () Source #
Sets the initial values for a set of MIDI controllers.
ctrlinit ichnl, ictlno1, ival1 [, ictlno2] [, ival2] [, ictlno3] \ [, ival3] [,...ival32]
csound doc: http://csound.com/docs/manual/ctrlinit.html
initc14 :: D -> D -> D -> D -> SE () Source #
Initializes the controllers used to create a 14-bit MIDI value.
initc14 ichan, ictlno1, ictlno2, ivalue
csound doc: http://csound.com/docs/manual/initc14.html
initc21 :: D -> D -> D -> D -> D -> SE () Source #
Initializes the controllers used to create a 21-bit MIDI value.
initc21 ichan, ictlno1, ictlno2, ictlno3, ivalue
csound doc: http://csound.com/docs/manual/initc21.html
initc7 :: D -> D -> D -> SE () Source #
Initializes the controller used to create a 7-bit MIDI value.
Initializes MIDI controller ictlno with ivalue
initc7 ichan, ictlno, ivalue
csound doc: http://csound.com/docs/manual/initc7.html
massign :: D -> D -> SE () Source #
Assigns a MIDI channel number to a Csound instrument.
massign ichnl, insnum[, ireset] massign ichnl, "insname"[, ireset]
csound doc: http://csound.com/docs/manual/massign.html
midic14 :: D -> D -> D -> D -> Sig Source #
Allows a floating-point 14-bit MIDI signal scaled with a minimum and a maximum range.
idest midic14 ictlno1, ictlno2, imin, imax [, ifn] kdest midic14 ictlno1, ictlno2, kmin, kmax [, ifn]
csound doc: http://csound.com/docs/manual/midic14.html
midic21 :: D -> D -> D -> D -> D -> Sig Source #
Allows a floating-point 21-bit MIDI signal scaled with a minimum and a maximum range.
idest midic21 ictlno1, ictlno2, ictlno3, imin, imax [, ifn] kdest midic21 ictlno1, ictlno2, ictlno3, kmin, kmax [, ifn]
csound doc: http://csound.com/docs/manual/midic21.html
midic7 :: D -> D -> D -> Sig Source #
Allows a floating-point 7-bit MIDI signal scaled with a minimum and a maximum range.
idest midic7 ictlno, imin, imax [, ifn] kdest midic7 ictlno, kmin, kmax [, ifn]
csound doc: http://csound.com/docs/manual/midic7.html
Get the current value (0-127) of a specified MIDI controller.
ival midictrl inum [, imin] [, imax] kval midictrl inum [, imin] [, imax]
csound doc: http://csound.com/docs/manual/midictrl.html
Get a note number from a MIDI event.
ival notnum
csound doc: http://csound.com/docs/manual/notnum.html
pchbend :: Msg -> Sig Source #
Get the current pitch-bend value for this channel.
ibend pchbend [imin] [, imax] kbend pchbend [imin] [, imax]
csound doc: http://csound.com/docs/manual/pchbend.html
pgmassign :: D -> D -> SE () Source #
Assigns an instrument number to a specified MIDI program.
Assigns an instrument number to a specified (or all) MIDI program(s).
pgmassign ipgm, inst[, ichn] pgmassign ipgm, "insname"[, ichn]
csound doc: http://csound.com/docs/manual/pgmassign.html
Returns the polyphonic after-touch pressure of the selected note number.
polyaft returns the polyphonic pressure of the selected note number, optionally mapped to an user-specified range.
ires polyaft inote [, ilow] [, ihigh] kres polyaft inote [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/polyaft.html
Get the velocity from a MIDI event.
ival veloc [ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/veloc.html
Output.
nrpn :: Sig -> Sig -> Sig -> SE () Source #
Sends a Non-Registered Parameter Number to the MIDI OUT port.
Sends a NPRN (Non-Registered Parameter Number) message to the MIDI OUT port each time one of the input arguments changes.
nrpn kchan, kparmnum, kparmvalue
csound doc: http://csound.com/docs/manual/nrpn.html
outiat :: D -> D -> D -> D -> SE () Source #
Sends MIDI aftertouch messages at i-rate.
outiat ichn, ivalue, imin, imax
csound doc: http://csound.com/docs/manual/outiat.html
outic :: D -> D -> D -> D -> D -> SE () Source #
Sends MIDI controller output at i-rate.
outic ichn, inum, ivalue, imin, imax
csound doc: http://csound.com/docs/manual/outic.html
outic14 :: D -> D -> D -> D -> D -> D -> SE () Source #
Sends 14-bit MIDI controller output at i-rate.
outic14 ichn, imsb, ilsb, ivalue, imin, imax
csound doc: http://csound.com/docs/manual/outic14.html
outipat :: D -> D -> D -> D -> D -> SE () Source #
Sends polyphonic MIDI aftertouch messages at i-rate.
outipat ichn, inotenum, ivalue, imin, imax
csound doc: http://csound.com/docs/manual/outipat.html
outipb :: D -> D -> D -> D -> SE () Source #
Sends MIDI pitch-bend messages at i-rate.
outipb ichn, ivalue, imin, imax
csound doc: http://csound.com/docs/manual/outipb.html
outipc :: D -> D -> D -> D -> SE () Source #
Sends MIDI program change messages at i-rate
outipc ichn, iprog, imin, imax
csound doc: http://csound.com/docs/manual/outipc.html
outkat :: Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends MIDI aftertouch messages at k-rate.
outkat kchn, kvalue, kmin, kmax
csound doc: http://csound.com/docs/manual/outkat.html
outkc :: Sig -> Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends MIDI controller messages at k-rate.
outkc kchn, knum, kvalue, kmin, kmax
csound doc: http://csound.com/docs/manual/outkc.html
outkc14 :: Sig -> Sig -> Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends 14-bit MIDI controller output at k-rate.
outkc14 kchn, kmsb, klsb, kvalue, kmin, kmax
csound doc: http://csound.com/docs/manual/outkc14.html
outkpat :: Sig -> Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends polyphonic MIDI aftertouch messages at k-rate.
outkpat kchn, knotenum, kvalue, kmin, kmax
csound doc: http://csound.com/docs/manual/outkpat.html
outkpb :: Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends MIDI pitch-bend messages at k-rate.
outkpb kchn, kvalue, kmin, kmax
csound doc: http://csound.com/docs/manual/outkpb.html
outkpc :: Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends MIDI program change messages at k-rate.
outkpc kchn, kprog, kmin, kmax
csound doc: http://csound.com/docs/manual/outkpc.html
Converters.
ampmidi :: Msg -> D -> D Source #
Get the velocity of the current MIDI event.
iamp ampmidi iscal [, ifn]
csound doc: http://csound.com/docs/manual/ampmidi.html
ampmidid :: D -> D -> Sig Source #
Musically map MIDI velocity to peak amplitude within a specified dynamic range in decibels.
iamplitude ampmidid ivelocity, idecibels kamplitude ampmidid kvelocity, idecibels
csound doc: http://csound.com/docs/manual/ampmidid.html
Get the note number of the current MIDI event, expressed in cycles-per-second.
icps cpsmidi
csound doc: http://csound.com/docs/manual/cpsmidi.html
cpsmidib :: Msg -> Sig Source #
Get the note number of the current MIDI event and modify it by the current pitch-bend value, express it in cycles-per-second.
icps cpsmidib [irange] kcps cpsmidib [irange]
csound doc: http://csound.com/docs/manual/cpsmidib.html
cpstmid :: Msg -> Tab -> D Source #
Get a MIDI note number (allows customized micro-tuning scales).
This unit is similar to cpsmidi, but allows fully customized micro-tuning scales.
icps cpstmid ifn
csound doc: http://csound.com/docs/manual/cpstmid.html
Get the note number, in octave-point-decimal units, of the current MIDI event.
ioct octmidi
csound doc: http://csound.com/docs/manual/octmidi.html
octmidib :: Msg -> Sig Source #
Get the note number of the current MIDI event and modify it by the current pitch-bend value, express it in octave-point-decimal.
ioct octmidib [irange] koct octmidib [irange]
csound doc: http://csound.com/docs/manual/octmidib.html
Get the note number of the current MIDI event, expressed in pitch-class units.
ipch pchmidi
csound doc: http://csound.com/docs/manual/pchmidi.html
pchmidib :: Msg -> Sig Source #
Get the note number of the current MIDI event and modify it by the current pitch-bend value, express it in pitch-class units.
ipch pchmidib [irange] kpch pchmidib [irange]
csound doc: http://csound.com/docs/manual/pchmidib.html
Generic I/O.
midiin :: (Sig, Sig, Sig, Sig) Source #
Returns a generic MIDI message received by the MIDI IN port.
Returns a generic MIDI message received by the MIDI IN port
kstatus, kchan, kdata1, kdata2 midiin
csound doc: http://csound.com/docs/manual/midiin.html
midiout :: Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends a generic MIDI message to the MIDI OUT port.
midiout kstatus, kchan, kdata1, kdata2
csound doc: http://csound.com/docs/manual/midiout.html
midiout_i :: D -> D -> D -> D -> SE () Source #
Sends a generic MIDI message to the MIDI OUT port.
midiout_i istatus, ichan, idata1, idata2
csound doc: http://csound.com/docs/manual/midiout_i.html
Event Extenders.
Indicates whether a note is in its âreleaseâ stage.
Provides a way of knowing when a note off message for the current note is received. Only a noteoff message with the same MIDI note number as the one which triggered the note will be reported by release.
kflag release
csound doc: http://csound.com/docs/manual/release.html
xtratim :: D -> SE () Source #
Extend the duration of real-time generated events.
Extend the duration of real-time generated events and handle their extra life (Usually for usage along with release instead of linenr, linsegr, etc).
xtratim iextradur
csound doc: http://csound.com/docs/manual/xtratim.html
Note Output.
midion :: Sig -> Sig -> Sig -> SE () Source #
Generates MIDI note messages at k-rate.
midion kchn, knum, kvel
csound doc: http://csound.com/docs/manual/midion.html
midion2 :: Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends noteon and noteoff messages to the MIDI OUT port.
Sends noteon and noteoff messages to the MIDI OUT port when triggered by a value different than zero.
midion2 kchn, knum, kvel, ktrig
csound doc: http://csound.com/docs/manual/midion2.html
moscil :: Sig -> Sig -> Sig -> Sig -> Sig -> SE () Source #
Sends a stream of the MIDI notes.
moscil kchn, knum, kvel, kdur, kpause
csound doc: http://csound.com/docs/manual/moscil.html
noteoff :: D -> D -> D -> SE () Source #
Send a noteoff message to the MIDI OUT port.
noteoff ichn, inum, ivel
csound doc: http://csound.com/docs/manual/noteoff.html
noteon :: D -> D -> D -> SE () Source #
Send a noteon message to the MIDI OUT port.
noteon ichn, inum, ivel
csound doc: http://csound.com/docs/manual/noteon.html
noteondur :: D -> D -> D -> D -> SE () Source #
Sends a noteon and a noteoff MIDI message both with the same channel, number and velocity.
noteondur ichn, inum, ivel, idur
csound doc: http://csound.com/docs/manual/noteondur.html
noteondur2 :: D -> D -> D -> D -> SE () Source #
Sends a noteon and a noteoff MIDI message both with the same channel, number and velocity.
noteondur2 ichn, inum, ivel, idur
csound doc: http://csound.com/docs/manual/noteondur2.html
MIDI/Score Interoperability.
midichannelaftertouch :: Sig -> SE () Source #
Gets a MIDI channel's aftertouch value.
midichannelaftertouch is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midichannelaftertouch xchannelaftertouch [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/midichannelaftertouch.html
Returns the MIDI channel number from which the note was activated.
midichn returns the MIDI channel number (1 - 16) from which the note was activated. In the case of score notes, it returns 0.
ichn midichn
csound doc: http://csound.com/docs/manual/midichn.html
midicontrolchange :: Sig -> Sig -> SE () Source #
Gets a MIDI control change value.
midicontrolchange is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midicontrolchange xcontroller, xcontrollervalue [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/midicontrolchange.html
mididefault :: Sig -> Sig -> SE () Source #
Changes values, depending on MIDI activation.
mididefault is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
mididefault xdefault, xvalue
csound doc: http://csound.com/docs/manual/mididefault.html
midinoteoff :: Sig -> Sig -> SE () Source #
Gets a MIDI noteoff value.
midinoteoff is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midinoteoff xkey, xvelocity
csound doc: http://csound.com/docs/manual/midinoteoff.html
midinoteoncps :: Sig -> Sig -> SE () Source #
Gets a MIDI note number as a cycles-per-second frequency.
midinoteoncps is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midinoteoncps xcps, xvelocity
csound doc: http://csound.com/docs/manual/midinoteoncps.html
midinoteonkey :: Sig -> Sig -> SE () Source #
Gets a MIDI note number value.
midinoteonkey is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midinoteonkey xkey, xvelocity
csound doc: http://csound.com/docs/manual/midinoteonkey.html
midinoteonoct :: Sig -> Sig -> SE () Source #
Gets a MIDI note number value as octave-point-decimal value.
midinoteonoct is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midinoteonoct xoct, xvelocity
csound doc: http://csound.com/docs/manual/midinoteonoct.html
midinoteonpch :: Sig -> Sig -> SE () Source #
Gets a MIDI note number as a pitch-class value.
midinoteonpch is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midinoteonpch xpch, xvelocity
csound doc: http://csound.com/docs/manual/midinoteonpch.html
midipitchbend :: Sig -> SE () Source #
Gets a MIDI pitchbend value.
midipitchbend is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midipitchbend xpitchbend [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/midipitchbend.html
midipolyaftertouch :: Sig -> Sig -> SE () Source #
Gets a MIDI polyphonic aftertouch value.
midipolyaftertouch is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midipolyaftertouch xpolyaftertouch, xcontrollervalue [, ilow] [, ihigh]
csound doc: http://csound.com/docs/manual/midipolyaftertouch.html
midiprogramchange :: Sig -> SE () Source #
Gets a MIDI program change value.
midiprogramchange is designed to simplify writing instruments that can be used interchangeably for either score or MIDI input, and to make it easier to adapt instruments originally written for score input to work with MIDI input.
midiprogramchange xprogram
csound doc: http://csound.com/docs/manual/midiprogramchange.html