tidal-1.9.4: Pattern language for improvised music
Safe HaskellSafe-Inferred
LanguageHaskell2010

Sound.Tidal.Params

Synopsis

Documentation

grp :: [String -> ValueMap] -> Pattern String -> ControlPattern Source #

group multiple params into one

pStateF Source #

Arguments

:: String

A parameter, e.g. note; a String recognizable by a ValueMap.

-> String

Identifies the cycling state pattern. Can be anything the user wants.

-> (Maybe Double -> Double) 
-> ControlPattern 

pStateList Source #

Arguments

:: String

A parameter, e.g. note; a String recognizable by a ValueMap.

-> String

Identifies the cycling state pattern. Can be anything the user wants.

-> [Value]

The list to cycle through.

-> ControlPattern 

pStateList is made with cyclic lists in mind, but it can even "cycle" through infinite lists.

pStateListF :: String -> String -> [Double] -> ControlPattern Source #

A wrapper for pStateList that accepts a `[Double]` rather than a `[Value]`.

pStateListS :: String -> String -> [String] -> ControlPattern Source #

A wrapper for pStateList that accepts a `[String]` rather than a `[Value]`.

drumN :: Num a => String -> a Source #

accelerate :: Pattern Double -> ControlPattern Source #

a pattern of numbers that speed up (or slow down) samples while they play.

amp :: Pattern Double -> ControlPattern Source #

like gain, but linear.

attack :: Pattern Double -> ControlPattern Source #

a pattern of numbers to specify the attack time (in seconds) of an envelope applied to each sample.

bandf :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the center frequency of the band-pass filter.

bandq :: Pattern Double -> ControlPattern Source #

a pattern of anumbers from 0 to 1. Sets the q-factor of the band-pass filter.

begin :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Skips the beginning of each sample, e.g. `0.25` to cut off the first quarter from each sample.

binshift :: Pattern Double -> ControlPattern Source #

Spectral binshift

channel :: Pattern Int -> ControlPattern Source #

choose the channel the pattern is sent to in superdirt

coarse :: Pattern Double -> ControlPattern Source #

fake-resampling, a pattern of numbers for lowering the sample rate, i.e. 1 for original 2 for half, 3 for a third and so on.

crush :: Pattern Double -> ControlPattern Source #

bit crushing, a pattern of numbers from 1 (for drastic reduction in bit-depth) to 16 (for barely no reduction).

cut :: Pattern Int -> ControlPattern Source #

In the style of classic drum-machines, cut will stop a playing sample as soon as another samples with in same cutgroup is to be played. An example would be an open hi-hat followed by a closed one, essentially muting the open.

cutoff :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Applies the cutoff frequency of the low-pass filter.

delay :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the level of the delay signal.

delayfeedback :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the amount of delay feedback.

delaytime :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the length of the delay.

distort :: Pattern Double -> ControlPattern Source #

noisy fuzzy distortion

djf :: Pattern Double -> ControlPattern Source #

DJ filter, below 0.5 is low pass filter, above is high pass filter.

dry :: Pattern Double -> ControlPattern Source #

when set to `1` will disable all reverb for this pattern. See room and size for more information about reverb.

end :: Pattern Double -> ControlPattern Source #

the same as begin, but cuts the end off samples, shortening them; e.g. `0.75` to cut off the last quarter of each sample.

fadeInTime :: Pattern Double -> ControlPattern Source #

As with fadeTime, but controls the fade in time of the grain envelope. Not used if the grain begins at position 0 in the sample.

fadeTime :: Pattern Double -> ControlPattern Source #

Used when using beginend or chopstriate and friends, to change the fade out time of the grain envelope.

from :: Pattern Double -> ControlPattern Source #

for internal sound routing

fshift :: Pattern Double -> ControlPattern Source #

frequency shifter

gain :: Pattern Double -> ControlPattern Source #

a pattern of numbers that specify volume. Values less than 1 make the sound quieter. Values greater than 1 make the sound louder. For the linear equivalent, see amp.

hbrick :: Pattern Double -> ControlPattern Source #

High pass sort of spectral filter

hcutoff :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Applies the cutoff frequency of the high-pass filter. Also has alias hpf

hold :: Pattern Double -> ControlPattern Source #

a pattern of numbers to specify the hold time (in seconds) of an envelope applied to each sample. Only takes effect if attack and release are also specified.

hresonance :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Applies the resonance of the high-pass filter. Has alias hpq

krush :: Pattern Double -> ControlPattern Source #

shape/bass enhancer

lbrick :: Pattern Double -> ControlPattern Source #

Low pass sort of spectral filter

legato :: Pattern Double -> ControlPattern Source #

controls the amount of overlap between two adjacent sounds

lock :: Pattern Double -> ControlPattern Source #

A pattern of numbers. Specifies whether delaytime is calculated relative to cps. When set to 1, delaytime is a direct multiple of a cycle.

loop :: Pattern Double -> ControlPattern Source #

loops the sample (from begin to end) the specified number of times.

n :: Pattern Note -> ControlPattern Source #

The note or sample number to choose for a synth or sampleset

note :: Pattern Note -> ControlPattern Source #

The note or pitch to play a sound or synth with

nudge :: Pattern Double -> ControlPattern Source #

Nudges events into the future by the specified number of seconds. Negative numbers work up to a point as well (due to internal latency)

orbit :: Pattern Int -> ControlPattern Source #

a pattern of numbers. An orbit is a global parameter context for patterns. Patterns with the same orbit will share hardware output bus offset and global effects, e.g. reverb and delay. The maximum number of orbits is specified in the superdirt startup, numbers higher than maximum will wrap around.

pan :: Pattern Double -> ControlPattern Source #

a pattern of numbers between 0 and 1, from left to right (assuming stereo), once round a circle (assuming multichannel)

panorient :: Pattern Double -> ControlPattern Source #

a pattern of numbers between -1.0 and 1.0, which controls the relative position of the centre pan in a pair of adjacent speakers (multichannel only)

panspan :: Pattern Double -> ControlPattern Source #

a pattern of numbers between -inf and inf, which controls how much multichannel output is fanned out (negative is backwards ordering)

pansplay :: Pattern Double -> ControlPattern Source #

a pattern of numbers between 0.0 and 1.0, which controls the multichannel spread range (multichannel only)

panwidth :: Pattern Double -> ControlPattern Source #

a pattern of numbers between 0.0 and inf, which controls how much each channel is distributed over neighbours (multichannel only)

phaserdepth :: Pattern Double -> ControlPattern Source #

Phaser Audio DSP effect | params are phaserrate and phaserdepth

phaserrate :: Pattern Double -> ControlPattern Source #

Phaser Audio DSP effect | params are phaserrate and phaserdepth

rate :: Pattern Double -> ControlPattern Source #

used in SuperDirt softsynths as a control rate or speed

real :: Pattern Double -> ControlPattern Source #

Spectral conform

release :: Pattern Double -> ControlPattern Source #

a pattern of numbers to specify the release time (in seconds) of an envelope applied to each sample.

resonance :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Specifies the resonance of the low-pass filter.

ring :: Pattern Double -> ControlPattern Source #

ring modulation

ringf :: Pattern Double -> ControlPattern Source #

ring modulation

room :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the level of reverb.

scram :: Pattern Double -> ControlPattern Source #

Spectral scramble

shape :: Pattern Double -> ControlPattern Source #

wave shaping distortion, a pattern of numbers from 0 for no distortion up to 1 for loads of distortion.

size :: Pattern Double -> ControlPattern Source #

a pattern of numbers from 0 to 1. Sets the perceptual size (reverb time) of the room to be used in reverb.

speed :: Pattern Double -> ControlPattern Source #

a pattern of numbers which changes the speed of sample playback, i.e. a cheap way of changing pitch. Negative values will play the sample backwards!

timescale :: Pattern Double -> ControlPattern Source #

time stretch amount

timescalewin :: Pattern Double -> ControlPattern Source #

time stretch window size

to :: Pattern Double -> ControlPattern Source #

for internal sound routing

toArg :: Pattern String -> ControlPattern Source #

for internal sound routing

tremolodepth :: Pattern Double -> ControlPattern Source #

Tremolo Audio DSP effect | params are tremolorate and tremolodepth

tremolorate :: Pattern Double -> ControlPattern Source #

Tremolo Audio DSP effect | params are tremolorate and tremolodepth

unit :: Pattern String -> ControlPattern Source #

used in conjunction with speed, accepts values of "r" (rate, default behavior), "c" (cycles), or "s" (seconds). Using `unit "c"` means speed will be interpreted in units of cycles, e.g. `speed "1"` means samples will be stretched to fill a cycle. Using `unit "s"` means the playback speed will be adjusted so that the duration is the number of seconds specified by speed.

vowel :: Pattern String -> ControlPattern Source #

formant filter to make things sound like vowels, a pattern of either a, e, i, o or u. Use a rest (~) for no effect.