/bala/bala-core/src/Bala/Core/Interval.hs

http://copperbox.googlecode.com/ · Haskell · 177 lines · 88 code · 52 blank · 37 comment · 5 complexity · f0b69e375a71f5896c213ba17bd270eb MD5 · raw file

  1. {-# LANGUAGE TypeFamilies #-}
  2. {-# OPTIONS -Wall #-}
  3. --------------------------------------------------------------------------------
  4. -- |
  5. -- Module : Bala.Core.Interval
  6. -- Copyright : (c) Stephen Tetley 2010
  7. -- License : BSD3
  8. --
  9. -- Maintainer : Stephen Tetley <stephen.tetley@gmail.com>
  10. -- Stability : highly unstable
  11. -- Portability : to be determined.
  12. --
  13. -- Pitch represention
  14. --
  15. --------------------------------------------------------------------------------
  16. module Bala.Core.Interval
  17. (
  18. -- * Datatypes
  19. Interval
  20. , arithmeticDistance
  21. , semitoneCount
  22. , IntervalQuality(..)
  23. -- * Type classes
  24. , IntervalContent(..)
  25. -- * Operations
  26. , makeInterval
  27. , intervalQuality
  28. , isComplement
  29. , intervalName
  30. , intervalPair
  31. , addOctave
  32. , divSimple
  33. ) where
  34. import Bala.Core.Invert
  35. import Bala.Core.Modulo
  36. import Data.AdditiveGroup -- VectorSpace
  37. import Data.Monoid
  38. --------------------------------------------------------------------------------
  39. -- Datatypes
  40. data Interval = Interval { arithmeticDistance :: Int, semitoneCount :: Int }
  41. deriving Eq
  42. data IntervalQuality = Diminished Int | Minor | Perfect | Major | Augmented Int
  43. deriving (Eq)
  44. --------------------------------------------------------------------------------
  45. -- Type classes
  46. -- | Extract the pitch content from some aggregate object (e.g. a chord).
  47. class IntervalContent c where
  48. intervalContent :: c -> [Interval]
  49. --------------------------------------------------------------------------------
  50. -- Instances
  51. instance Show Interval where
  52. showsPrec p (Interval ad sc) = showsPrec p (ad,sc)
  53. -- Note the @mempty@ instance is the unison interval (1,0).
  54. instance Monoid Interval where
  55. mempty = Interval 1 0
  56. (Interval ad sc) `mappend` (Interval ad' sc') = Interval (ad+ad'-1) (sc+sc')
  57. instance AdditiveGroup Interval where
  58. zeroV = mempty
  59. (^+^) = mappend
  60. negateV (Interval ad sc) = Interval ad (negate sc) -- !!
  61. -- This will need some quickchecking...
  62. instance Invert Interval where
  63. -- Erk - this is correct only for simple intervals...
  64. invert (Interval ad sc) = Interval ad' (12 - sc)
  65. where
  66. ad' = ad `rdif` 9
  67. instance Show IntervalQuality where
  68. showsPrec _ (Diminished n) = showString $ replicate n 'd'
  69. showsPrec _ Minor = showChar 'm'
  70. showsPrec _ Perfect = showChar 'P'
  71. showsPrec _ Major = showChar 'M'
  72. showsPrec _ (Augmented n) = showString $ replicate n 'A'
  73. --------------------------------------------------------------------------------
  74. -- | @makeInterval arithmetic-distance semintone-count@ - 0 is an
  75. -- illegal value for arithmetic distance and will generate a
  76. -- runtime error.
  77. makeInterval :: Int -> Int -> Interval
  78. makeInterval i j | i /= 0 = Interval i j
  79. | otherwise = error msg
  80. where
  81. msg = "Interval.makeInterval - cannot make interval with arthimetic "
  82. ++ " distance == 0."
  83. -- | rdif is the analogue to subtraction on arithmetic distances,
  84. -- but it is the difference between the larger and the smaller
  85. -- and hence will always generate a positive answer.
  86. rdif :: Int -> Int -> Int
  87. rdif a b = max a b - ((min a b) - 1)
  88. isComplement :: Interval -> Interval -> Bool
  89. isComplement a b = a `mappend` b == makeInterval 8 12
  90. intervalQuality :: Interval -> IntervalQuality
  91. intervalQuality (Interval ad sc) =
  92. either (dpa $ mod12 sc) (dmma $ mod12 sc) $ genRegular $ ad
  93. where
  94. dpa s n | s > n = Augmented (s-n)
  95. | s < n = Diminished (n-s)
  96. | otherwise = Perfect
  97. dmma s (mn,mj) | s == mn = Minor
  98. | s == mj = Major
  99. | s < mn = Diminished (mn-s)
  100. | s > mj = Augmented (s-mj)
  101. | otherwise = error "intervalQuality - unreachable"
  102. genRegular :: Int -> Either Int (Int,Int)
  103. genRegular = fn . amod7 where
  104. fn 1 = Left 0
  105. fn 2 = Right (1,2)
  106. fn 3 = Right (3,4)
  107. fn 4 = Left 5
  108. fn 5 = Left 7
  109. fn 6 = Right (8,9)
  110. fn 7 = Right (10,11)
  111. fn _ = error "genRegular - unreachable"
  112. intervalName :: Interval -> String
  113. intervalName ival@(Interval ad _) = show (intervalQuality ival) ++ show ad
  114. intervalPair :: Interval -> (Int,Int)
  115. intervalPair (Interval i j) = (i,j)
  116. addOctave :: Interval -> Interval
  117. addOctave = mappend (makeInterval 8 12)
  118. -- amod7 [1-7]
  119. amod7 :: Int -> Int
  120. amod7 i = 1 + ((i-1) `mod` 7)
  121. -- Simple interval from compound interval
  122. divSimple :: Interval -> (Int,Interval)
  123. divSimple (Interval ad sc) = (d, Interval (amod7 ad) sc')
  124. where
  125. (d,sc') = sc `divMod` 12