haskore-0.0.5: The Haskore Computer Music SystemSource codeContentsIndex
Haskore.Composition.Chord
Documentation
type T = [Relative]Source
pitchToInterval :: T -> TSource
intervalToPitch :: T -> TSource
intervalInvert :: T -> TSource
sameInterval :: T -> T -> BoolSource
minorInt :: [Relative]Source
type Inversion = IntSource
fromIntervals :: [Relative] -> Inversion -> T note -> [T note]Source
minor :: Inversion -> T note -> [T note]Source
data Generic attr Source
Constructors
Generic
genericPitchClass :: Class
genericIntervals :: T
genericDur :: Dur
genericAttr :: attr
type Boundary = (T, T)Source
generic :: Class -> T -> Dur -> attr -> Generic attrSource
leastVaryingInversions :: Boundary -> [Generic attr] -> [[T attr]]Source
inversionIncrement :: T -> DoubleSource
matchingInversion :: Generic attr -> Double -> DoubleSource
mean :: [Relative] -> DoubleSource
chordCenter :: Generic attr -> DoubleSource
boundaryCenter :: (Octave, Inversion) -> Generic attr -> DoubleSource
invert :: Inversion -> T -> TSource
genericToNotes :: Inversion -> Generic attr -> [T attr]Source
shortestWays :: (Num b, Ord b) => (a -> a -> b) -> [[a]] -> [(b, [a])]Source
processZone :: (Num b, Ord b) => (a -> a -> b) -> [a] -> [(b, [a])] -> [(b, [a])]Source
propShortestWays :: Int -> Int -> BoolSource
leastVaryingInversionsSW :: Boundary -> [Generic attr] -> [[T attr]]Source
inversionCenters :: Boundary -> [Generic attr] -> [[(Inversion, Double)]]Source
harmonicGen :: attr -> Dur -> [Dur -> attr -> T attr] -> T attrSource
Produced by Haddock version 2.3.0