Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Signals & wavetables
Synopsis
- blend :: Num a => a -> a -> a -> a
- clipAt :: Int -> [a] -> a
- blendAtBy :: (Integral i, RealFrac n) => (i -> t -> n) -> n -> t -> n
- blendAt :: RealFrac a => a -> [a] -> a
- resamp1_gen :: (Integral i, RealFrac n) => i -> i -> (i -> t -> n) -> t -> i -> n
- resamp1 :: RealFrac n => Int -> [n] -> [n]
- normalizeSum :: Fractional a => [a] -> [a]
- normalise_rng :: Fractional n => (n, n) -> (n, n) -> [n] -> [n]
- normalize :: (Fractional n, Ord n) => n -> n -> [n] -> [n]
- t2_window :: Integral i => i -> [t] -> [(t, t)]
- t2_adjacent :: [t] -> [(t, t)]
- t2_overlap :: [b] -> [(b, b)]
- t2_concat :: [(a, a)] -> [a]
- from_wavetable :: Num n => [n] -> [n]
- to_wavetable :: Num a => [a] -> [a]
- to_wavetable_nowrap :: Num a => [a] -> [a]
- sineGen :: (Floating n, Enum n) => Int -> [n] -> [n] -> [[n]]
- sineFill :: (Ord n, Floating n, Enum n) => Int -> [n] -> [n] -> [n]
Documentation
blend :: Num a => a -> a -> a -> a Source #
z ranges from 0 (for i) to 1 (for j).
1.5.blend(2.0,0.50)
- 75 > 1.5.blend(2.0,0.75)
- 875
>>>
blend 0.50 1.5 2
1.75
>>>
blend 0.75 1.5 2
1.875
clipAt :: Int -> [a] -> a Source #
Variant of (!!)
but values for index greater than the size of the collection will be clipped to the last index.
>>>
map (\x -> clipAt x "abc") [-1,0,1,2,3]
"aabcc"
blendAtBy :: (Integral i, RealFrac n) => (i -> t -> n) -> n -> t -> n Source #
blendAt
with clip
function as argument.
blendAt :: RealFrac a => a -> [a] -> a Source #
SequenceableCollection.blendAt
returns a linearly interpolated value between the two closest indices.
Inverse operation is indexInBetween
.
[2,5,6].blendAt(0.4)
- 2
>>>
blendAt 0 [2,5,6]
2.0>>>
blendAt 0.4 [2,5,6]
3.2
resamp1_gen :: (Integral i, RealFrac n) => i -> i -> (i -> t -> n) -> t -> i -> n Source #
Resampling function, n is destination length, r is source length, f is the indexing function, c is the collection.
resamp1 :: RealFrac n => Int -> [n] -> [n] Source #
SequenceableCollection.resamp1
returns a new collection of the desired length, with values resampled evenly-spaced from the receiver with linear interpolation.
[1].resamp1(3) == [1,1,1] [1,2,3,4].resamp1(12) [1,2,3,4].resamp1(3) == [1,2.5,4]
>>>
resamp1 3 [1]
[1.0,1.0,1.0]
>>>
resamp1 7 [1,2,3,4]
[1.0,1.5,2.0,2.5,3.0,3.5,4.0]
>>>
resamp1 3 [1,2,3,4]
[1.0,2.5,4.0]
normalizeSum :: Fractional a => [a] -> [a] Source #
ArrayedCollection.normalizeSum
ensures sum of elements is one.
[1,2,3].normalizeSum == [1/6,1/3,0.5]
>>>
normalizeSum [1,2,3] == [1/6,2/6,3/6]
True
normalise_rng :: Fractional n => (n, n) -> (n, n) -> [n] -> [n] Source #
Variant that specifies range of input sequence separately.
normalize :: (Fractional n, Ord n) => n -> n -> [n] -> [n] Source #
ArrayedCollection.normalize
returns a new Array with the receiver items normalized between min and max.
[1,2,3].normalize == [0,0.5,1] [1,2,3].normalize(-20,10) == [-20,-5,10]
>>>
normalize 0 1 [1,2,3]
[0.0,0.5,1.0]
>>>
normalize (-20) 10 [1,2,3]
[-20.0,-5.0,10.0]
t2_window :: Integral i => i -> [t] -> [(t, t)] Source #
List of 2-tuples of elements at distance (stride) n.
>>>
t2_window 3 [1..9]
[(1,2),(4,5),(7,8)]
t2_adjacent :: [t] -> [(t, t)] Source #
List of 2-tuples of adjacent elements.
>>>
t2_adjacent [1..6]
[(1,2),(3,4),(5,6)]
>>>
t2_adjacent [1..5]
[(1,2),(3,4)]
t2_overlap :: [b] -> [(b, b)] Source #
List of 2-tuples of overlapping elements.
>>>
t2_overlap [1..4]
[(1,2),(2,3),(3,4)]
t2_concat :: [(a, a)] -> [a] Source #
Concat of 2-tuples.
>>>
t2_concat (t2_adjacent [1..6])
[1,2,3,4,5,6]
>>>
t2_concat (t2_overlap [1..4])
[1,2,2,3,3,4]
from_wavetable :: Num n => [n] -> [n] Source #
A Signal is half the size of a Wavetable, each element is the sum of two adjacent elements of the Wavetable.
>>>
from_wavetable [-0.5,0.5,0,0.5,1.5,-0.5,1,-0.5]
[0.0,0.5,1.0,0.5]
>>>
let s = [0,0.5,1,0.5]
>>>
from_wavetable (to_wavetable s) == s
True
to_wavetable :: Num a => [a] -> [a] Source #
A Wavetable has n * 2 elements, where n is the number of elements of the Signal. Each signal element e0 expands to the two elements (2 * e0 - e1, e1 - e0) where e1 is the next element, or zero at the final element. Properly wavetables are only of power of two element signals.
Signal[0,0.5,1,0.5].asWavetable == Wavetable[-0.5,0.5,0,0.5,1.5,-0.5,1,-0.5]
>>>
to_wavetable [0,0.5,1,0.5]
[-0.5,0.5,0.0,0.5,1.5,-0.5,1.0,-0.5]
to_wavetable_nowrap :: Num a => [a] -> [a] Source #
Shaper requires wavetables without wrap.
>>>
to_wavetable_nowrap [0,0.5,1,0.5]
[-0.5,0.5,0.0,0.5,1.5,-0.5]
sineGen :: (Floating n, Enum n) => Int -> [n] -> [n] -> [[n]] Source #
Variant of sineFill
that gives each component table.
>>>
let t = sineGen 1024 (map recip [1, 2, 3, 5, 8, 13, 21, 34, 55]) (replicate 9 0)
>>>
map length t == replicate 9 1024
True
Sound.Sc3.Plot.plot_p1_ln t
sineFill :: (Ord n, Floating n, Enum n) => Int -> [n] -> [n] -> [n] Source #
Signal.*sineFill
is a table generator.
Frequencies are partials, amplitudes and initial phases are as given.
Result is normalised.
let a = [[21,5,34,3,2,13,1,8,55],[13,8,55,34,5,21,3,1,2],[55,34,1,3,2,13,5,8,21]] let t = map (\amp -> sineFill 1024 (map recip amp) (replicate 9 0)) a Sound.Sc3.Plot.plot_p1_ln t