module Music.Theory.Contour.Polansky_1992 where
import Data.List
import Data.List.Split
import qualified Data.Map as M
import Data.Maybe
import Data.Ratio
import qualified Music.Theory.Set as T
import qualified Music.Theory.Permutations as T
compare_adjacent :: Ord a => [a] -> [Ordering]
compare_adjacent xs = zipWith compare xs (tail xs)
matrix_f :: (a -> a -> b) -> [a] -> [[b]]
matrix_f f =
let g (x,xs) = map (\x' -> f x x') xs
h xs = map (\x -> (x,xs)) xs
in map g . h
contour_matrix :: Ord a => [a] -> [[Ordering]]
contour_matrix = matrix_f compare
data Contour_Half_Matrix = Contour_Half_Matrix {
contour_half_matrix_n :: Int
, contour_half_matrix_m :: [[Ordering]] } deriving (Eq)
half_matrix_f :: (a -> a -> b) -> [a] -> [[b]]
half_matrix_f f xs =
let drop_last = reverse . drop 1 . reverse
m = drop_last (matrix_f f xs)
in map (\(i,ns) -> drop i ns) (zip [1..] m)
contour_half_matrix :: Ord a => [a] -> Contour_Half_Matrix
contour_half_matrix xs =
let hm = half_matrix_f compare xs
in Contour_Half_Matrix (length xs) hm
contour_half_matrix_str :: Contour_Half_Matrix -> String
contour_half_matrix_str (Contour_Half_Matrix _ hm) =
let hm' = map (concatMap (show . fromEnum)) hm
in intercalate " " hm'
instance Show Contour_Half_Matrix where
show = contour_half_matrix_str
ord_to_int :: Integral a => Ordering -> a
ord_to_int = fromIntegral . fromEnum
int_to_ord :: Integral a => a -> Ordering
int_to_ord = toEnum . fromIntegral
data Contour_Description = Contour_Description {
contour_description_n :: Int
, contour_description_m :: M.Map (Int,Int) Ordering } deriving (Eq)
adjacent_indices :: Integral i => i -> [(i,i)]
adjacent_indices n = zip [0..n2] [1..n1]
all_indices :: Integral i => i -> [(i,i)]
all_indices n =
let n' = n 1
in [(i,j) | i <- [0 .. n'], j <- [i + 1 .. n']]
contour_description :: Ord a => [a] -> Contour_Description
contour_description x =
let n = length x
ix = all_indices n
o = zip ix (map (\(i,j) -> compare (x !! i) (x !! j)) ix)
in Contour_Description n (M.fromList o)
contour_description_str :: Contour_Description -> String
contour_description_str (Contour_Description n m) =
let xs = concatMap (show . fromEnum . snd) (M.toList m)
in intercalate " " (splitPlaces [n1,n2 .. 0] xs)
instance Show Contour_Description where
show = contour_description_str
half_matrix_to_description :: Contour_Half_Matrix -> Contour_Description
half_matrix_to_description (Contour_Half_Matrix n hm) =
let ix = all_indices n
o = zip ix (concat hm)
in Contour_Description n (M.fromList o)
contour_description_ix :: Contour_Description -> (Int,Int) -> Ordering
contour_description_ix d i = contour_description_m d M.! i
all_equal :: Eq a => [a] -> Bool
all_equal xs = all id (zipWith (==) xs (tail xs))
uniform :: Contour_Description -> Bool
uniform (Contour_Description _ m) = all_equal (M.elems m)
no_equalities :: Contour_Description -> Bool
no_equalities (Contour_Description _ m) = not (EQ `elem` M.elems m)
all_contours :: Int -> [Contour_Description]
all_contours n =
let n' = contour_description_lm n
ix = all_indices n
cs = filter (not.null) (T.powerset [LT,EQ,GT])
ps = concatMap (concatMap T.multiset_permutations . T.se n') cs
mk p = Contour_Description n (M.fromList (zip ix p))
in map mk ps
violations :: Contour_Description -> [(Int, Int, Int, Ordering)]
violations d =
let n = contour_description_n d 1
ms = [(i,j,k) | i <- [0..n], j <- [i + 1 .. n], k <- [j + 1 .. n]]
ix = contour_description_ix d
complies (i,j,k) =
let l = ix (i,j)
r = ix (j,k)
b = ix (i,k)
in case implication (l,r) of
Nothing -> Nothing
Just x -> if x == b
then Nothing
else Just (i,j,k,x)
in mapMaybe complies ms
is_possible :: Contour_Description -> Bool
is_possible = (== 0) . length . violations
possible_contours :: Int -> [Contour_Description]
possible_contours = filter is_possible . all_contours
impossible_contours :: Int -> [Contour_Description]
impossible_contours = filter (not.is_possible) . all_contours
contour_description_lm :: Integral a => a -> a
contour_description_lm l = (l * l l) `div` 2
implication :: (Ordering,Ordering) -> Maybe Ordering
implication (i,j) =
case (min i j,max i j) of
(LT,LT) -> Just LT
(LT,EQ) -> Just LT
(LT,GT) -> Nothing
(EQ,EQ) -> Just EQ
(EQ,GT) -> Just GT
(GT,GT) -> Just GT
_ -> error "implication"
replace :: Integral i => [a] -> i -> a -> [a]
replace ns i x =
let fn (j,y) = if i == j then x else y
in map fn (zip [0..] ns)
draw_contour :: Integral i => Contour_Description -> [i]
draw_contour d =
let n = contour_description_n d
ix = all_indices n
normalise :: Integral i => [Rational] -> [i]
normalise xs =
let xs' = nub (sort xs)
in map (\i -> fromIntegral (fromJust (findIndex (== i) xs'))) xs
adjustment x = if x == 0 then 1 else 1 % (denominator x * 2)
step (i,j) ns = let c = contour_description_ix d (i,j)
i' = ns !! i
j' = ns !! j
c' = compare i' j'
in if c == c'
then Nothing
else let j'' = case c of
LT -> i' + (adjustment j')
EQ -> i'
GT -> i' (adjustment j')
in Just (replace ns j j'')
refine [] ns = ns
refine (i:is) ns = case step i ns of
Nothing -> refine is ns
Just ns' -> refine ix ns'
in normalise (refine ix (replicate n 0))
ord_invert :: Ordering -> Ordering
ord_invert x =
case x of
LT -> GT
EQ -> EQ
GT -> LT
contour_description_invert :: Contour_Description -> Contour_Description
contour_description_invert (Contour_Description n m) =
Contour_Description n (M.map ord_invert m)
ex_1 :: [Rational]
ex_1 = [2,3%2,1%2,1,2]
ex_2 :: [Integer]
ex_2 = [0,5,3]
ex_3 :: [Integer]
ex_3 = [12,7,6,7,8,7]
ex_4 :: Contour_Description
ex_4 =
let ns :: [[Int]]
ns = [[2,2,2,1],[2,2,0],[0,0],[1]]
ns' = map (map int_to_ord) ns
in half_matrix_to_description (Contour_Half_Matrix 5 ns')