ParentContentsIndex
Sound.Hommage.Seq
Synopsis
runNumNotation :: (IsDur d, Num a) => Notation (WithDur d [a]) -> d -> [a]
bpmToDur :: Double -> Dur
newtype Seq a = SEQ {
unSeq :: [[a]]
}
noteSeq :: (IsDur d) => a -> WithDur d (Seq a)
noteSeq' :: (IsDur d) => WithDur d a -> WithDur d (Seq a)
mixdownNumSeq :: (Num a) => Seq [a] -> [a]
applySeq :: (s -> s) -> Seq (s -> a) -> s -> Seq a
applySeqE :: (s -> s) -> Seq (Either (s -> a) (s -> s)) -> s -> Seq a
filterSeq :: (a -> Maybe b) -> Seq a -> Seq b
Documentation
runNumNotation :: (IsDur d, Num a) => Notation (WithDur d [a]) -> d -> [a]
bpmToDur :: Double -> Dur
newtype Seq a
A Seq represents a temporal sequence of "Moments". Each moment can contain some events of type a.
Constructors
SEQ
unSeq :: [[a]]
Instances
Arrangeable (Seq a)
(IsDur d) => Musical (WithDur d (Seq a))
noteSeq :: (IsDur d) => a -> WithDur d (Seq a)
Creates a Seq with the length that the Reader reads. (The length will be in any case at least 1).
noteSeq' :: (IsDur d) => WithDur d a -> WithDur d (Seq a)
mixdownNumSeq :: (Num a) => Seq [a] -> [a]
applySeq :: (s -> s) -> Seq (s -> a) -> s -> Seq a
applySeqE :: (s -> s) -> Seq (Either (s -> a) (s -> s)) -> s -> Seq a
filterSeq :: (a -> Maybe b) -> Seq a -> Seq b
Produced by Haddock version HADDOCK_VERSION