/hsc3-tree/src/lib/Sound/SC3/Tree/Type.hs

http://github.com/8c6794b6/haskell-sc-scratch · Haskell · 381 lines · 239 code · 51 blank · 91 comment · 37 complexity · d08ba27543f57f84ee780f82a39691ab MD5 · raw file

  1. {-# LANGUAGE DeriveDataTypeable #-}
  2. {-|
  3. Module : $Header$
  4. CopyRight : (c) 8c6794b6
  5. License : BSD3
  6. Maintainer : 8c6794b6@gmail.com
  7. Stability : unstable
  8. Portability : unknown
  9. Representation of scsynth node tree.
  10. -}
  11. module Sound.SC3.Tree.Type
  12. ( -- * Types
  13. SCNode(..)
  14. , SynthParam(..)
  15. , nodeId
  16. , synthName
  17. , synthParams
  18. , isSynth
  19. , isGroup
  20. , mapSCNode
  21. , filterSCNode
  22. -- * Parser
  23. , parseNode
  24. -- * Converter
  25. , treeToNew
  26. , treeToNewWith
  27. , treeToSet
  28. , paramToTuple
  29. , drawSCNode
  30. , renderSCNode
  31. , prettyDump
  32. -- * Util
  33. , paramName
  34. , paramValue
  35. , updateParams
  36. , nodeIds
  37. , hasUniqueIds
  38. ) where
  39. {-
  40. XXX:
  41. This package may use /Query_Node/ data type from "Sound.SC3.Status" when the
  42. data type become available.
  43. -}
  44. import Control.DeepSeq (NFData(..), deepseq)
  45. import Control.Monad
  46. import Data.ByteString.Char8 (unpack)
  47. import Data.Function (on)
  48. import Data.Data (Data,Typeable)
  49. import Data.List (unionBy)
  50. import Text.PrettyPrint hiding (int, double)
  51. import Sound.SC3
  52. import Sound.OSC hiding (int32, string)
  53. import Sound.SC3.Parser.Datum
  54. import qualified Text.PrettyPrint as P
  55. import qualified Data.IntSet as IS
  56. ------------------------------------------------------------------------------
  57. --
  58. -- Types
  59. --
  60. ------------------------------------------------------------------------------
  61. -- | Data type for representing Group and Synth node in scsynth.
  62. data SCNode = Group {-# UNPACK #-} !Int [SCNode]
  63. -- ^ Group node
  64. | Synth {-# UNPACK #-} !Int String [SynthParam]
  65. -- ^ Synth node
  66. deriving (Eq,Read,Show,Data,Typeable)
  67. instance NFData SCNode where
  68. rnf n = case n of
  69. Group i ns -> i `seq` ns `deepseq` ()
  70. Synth i name ps -> i `seq` name `deepseq` ps `deepseq` ()
  71. -- | Data type for synth param.
  72. data SynthParam = String := Double
  73. -- ^ Double value
  74. | String :<- Int
  75. -- ^ Mapped control bus id
  76. | String :<= Int
  77. -- ^ Mapped audio bus id
  78. deriving (Eq,Read,Data,Typeable)
  79. instance Show SynthParam where
  80. show (f:=x) = show f ++ ":=" ++ show x
  81. show (f:<-x) = show f ++ ":<-" ++ show x
  82. show (f:<=x) = show f ++ ":<=" ++ show x
  83. instance NFData SynthParam where
  84. rnf p = case p of
  85. n := v -> n `deepseq` v `seq` ()
  86. n :<- v -> n `deepseq` v `seq` ()
  87. n :<= v -> n `deepseq` v `seq` ()
  88. infixr 5 :=
  89. infixr 5 :<-
  90. infixr 5 :<=
  91. -- | 'True' if given node is synth.
  92. isSynth :: SCNode -> Bool
  93. isSynth n = case n of Synth _ _ _ -> True; _ -> False
  94. -- | 'True' if given node is group.
  95. isGroup :: SCNode -> Bool
  96. isGroup = not . isSynth
  97. -- | Returns node id of synth and group node.
  98. nodeId :: SCNode -> Int
  99. nodeId (Group i _) = i
  100. nodeId (Synth i _ _) = i
  101. -- | Get name from 'Synth' constructor. Group nodes will return empty
  102. -- string.
  103. synthName :: SCNode -> String
  104. synthName n = case n of
  105. Synth _ n' _ -> n'
  106. _ -> ""
  107. -- | Get 'SynthParam' of given synth node. Returns empty list for group node.
  108. synthParams :: SCNode -> [SynthParam]
  109. synthParams n = case n of
  110. Synth _ _ ps -> ps
  111. _ -> []
  112. -- | Map given function to 'SCNode'.
  113. mapSCNode :: (SCNode -> SCNode) -> SCNode -> SCNode
  114. mapSCNode f n0 =
  115. let g n = case n of
  116. Synth {} -> f n
  117. Group i ns -> f $ Group i $ foldr (\m ms -> g m : ms) [] ns
  118. in g n0
  119. {-# INLINEABLE mapSCNode #-}
  120. -- | Filter 'SCNode' with given condition.
  121. filterSCNode :: (SCNode -> Bool) -> SCNode -> SCNode
  122. filterSCNode p n0 =
  123. let f n acc =
  124. case n of
  125. Group i ns | p n -> Group i (foldr f [] ns) : acc
  126. | otherwise -> acc
  127. Synth {} | p n -> n : acc
  128. | otherwise -> acc
  129. in head $ foldr f [] [n0]
  130. {-# INLINEABLE filterSCNode #-}
  131. -- | Parse osc message returned from \"/g_queryTree\" and returns haskell
  132. -- representation of scsynth node tree.
  133. parseNode :: Message -> SCNode
  134. parseNode o = case o of
  135. Message "/g_queryTree.reply" ds -> case parseDatum parseGroup ds of
  136. Right tree -> tree
  137. Left err -> error $ show err
  138. _ -> error "not a /g_queryTree.reply response"
  139. {-# INLINEABLE parseNode #-}
  140. --
  141. -- With using simple parser without parsec
  142. --
  143. -- parseOSC :: OSC -> SCNode
  144. -- parseOSC o = case o of
  145. -- Message "/g_queryTree.reply" ds -> fst $ head $ parse parseGroup (tail ds)
  146. -- _ -> error "not a g_queryTree.reply message"
  147. parseGroup :: DatumParser SCNode
  148. parseGroup = do
  149. flag <- int32
  150. case flag of
  151. 1 -> parseGroupWith parseSynth
  152. _ -> parseGroupWith parseSynthWithoutParams
  153. {-# INLINEABLE parseGroup #-}
  154. parseGroupWith :: (Int -> DatumParser SCNode) -> DatumParser SCNode
  155. parseGroupWith synthParser = do
  156. nid <- int32
  157. numChild <- int32
  158. if numChild < 0
  159. then synthParser (fromIntegral nid)
  160. else Group (fromIntegral nid) `fmap`
  161. replicateM (fromIntegral numChild) (parseGroupWith synthParser)
  162. {-# INLINEABLE parseGroupWith #-}
  163. parseSynth :: Int -> DatumParser SCNode
  164. parseSynth nId = do
  165. name <- unpack `fmap` string
  166. numParams <- int32
  167. params <- replicateM (fromIntegral numParams) parseParam
  168. return $ Synth nId name params
  169. {-# INLINEABLE parseSynth #-}
  170. parseSynthWithoutParams :: Int -> DatumParser SCNode
  171. parseSynthWithoutParams nid = do
  172. name <- unpack `fmap` string
  173. return $ Synth nid name []
  174. {-# INLINEABLE parseSynthWithoutParams #-}
  175. -- | Parse parameter values for each synth.
  176. parseParam :: DatumParser SynthParam
  177. parseParam = do
  178. name <- unpack `fmap` string
  179. val <- datum
  180. case val of
  181. Float x -> return $ name := realToFrac x
  182. Double x -> return $ name := x
  183. ASCII_String xs ->
  184. let xs' = unpack xs
  185. in case xs' of
  186. 'c':rest -> return $ name :<- read rest
  187. 'a':rest -> return $ name :<= read rest
  188. _ -> error $ "Unknown param: " ++ xs'
  189. Int32 x -> return $ name := fromIntegral x
  190. e -> error $ "Cannot make param from: " ++ show e
  191. {-# INLINEABLE parseParam #-}
  192. ------------------------------------------------------------------------------
  193. --
  194. -- Converting functions
  195. --
  196. ------------------------------------------------------------------------------
  197. -- | SCNode to [OSC] for creating new nodes.
  198. --
  199. -- OSC list contains \"g_new\", \"s_new\", and \"n_map\" messages to build
  200. -- the given SCNode. New node will be added to tail of target id.
  201. --
  202. treeToNew :: Int -- ^ Target node id
  203. -> SCNode -- ^ New nodes
  204. -> [Message]
  205. treeToNew = treeToNewWith AddToTail
  206. treeToNewWith :: AddAction -- ^ Add action for this node
  207. -> Int -- ^ Target node id
  208. -> SCNode -- ^ New node to add
  209. -> [Message]
  210. treeToNewWith aa tId tree = f tId tree
  211. where
  212. f i t = case t of
  213. Group j ns -> g_new [(j,aa,i)]:concatMap (f j) ns
  214. Synth j n ps -> s_new n j aa i (concatMap paramToTuple ps):g j ps
  215. g i xs | not (null cs) && not (null as) = [n_map i cs,n_mapa i as]
  216. | not (null cs) && null as = [n_map i cs]
  217. | null cs && not (null as) = [n_mapa i as]
  218. | otherwise = []
  219. where (cs,as) = foldr h ([],[]) xs
  220. h x (cs,as) = case x of
  221. (name:<-bus) -> ((name,bus):cs,as)
  222. (name:<=bus) -> (cs,(name,bus):as)
  223. _ -> (cs,as)
  224. -- | SCNode to [OSC] for updating nodes.
  225. --
  226. -- OSC list contains \"n_set\" and \"n_map\" messages to set parameters.
  227. --
  228. treeToSet :: SCNode -- ^ Node with new parameters for already exisitng nodes.
  229. -> [Message]
  230. treeToSet tree = f tree
  231. where
  232. f t = case t of
  233. Group _ ns -> concatMap f ns
  234. Synth _ _ [] -> []
  235. Synth j _ ps -> n_set j (concatMap paramToTuple ps):g j ps
  236. g k ps | not (null cs) && not (null as) = [n_map k cs,n_mapa k as]
  237. | not (null cs) && null as = [n_map k cs]
  238. | null cs && not (null as) = [n_mapa k as]
  239. | otherwise = []
  240. where (cs,as) = foldr h ([],[]) ps
  241. h x (cs,as) = case x of
  242. (name:<-bus) -> ((name,bus):cs,as)
  243. (name:<=bus) -> (cs,(name,bus):as)
  244. _ -> (cs,as)
  245. ------------------------------------------------------------------------------
  246. --
  247. -- Utils
  248. --
  249. ------------------------------------------------------------------------------
  250. paramToTuple :: SynthParam -> [(String,Double)]
  251. paramToTuple (name := val) = [(name,val)]
  252. paramToTuple _ = []
  253. paramName :: SynthParam -> String
  254. paramName x = case x of
  255. (n := _) -> n
  256. (n :<- _) -> n
  257. (n :<= _) -> n
  258. -- | Converts value of 'SynthParam' to 'Double'. Information of mapped buses
  259. -- will be lost.
  260. paramValue :: SynthParam -> Double
  261. paramValue p = case p of
  262. _ := v -> v
  263. _ :<- v -> fromIntegral v
  264. _ :<= v -> fromIntegral v
  265. updateParams :: [SynthParam] -> SCNode -> SCNode
  266. updateParams ps node = case node of
  267. Synth i n ps' -> Synth i n (unionBy ((==) `on` paramName) ps ps')
  268. g -> g
  269. hasUniqueIds :: SCNode -> Bool
  270. hasUniqueIds n = listSize == setSize where
  271. setSize = IS.size . IS.fromList $ l
  272. listSize = length l
  273. l = nodeIds n
  274. nodeIds :: SCNode -> [Int]
  275. nodeIds n =
  276. let f x acc = case x of
  277. Synth nid _ _ -> nid : acc
  278. Group nid ns -> nid : foldr f acc ns
  279. in foldr f [] [n]
  280. ------------------------------------------------------------------------------
  281. --
  282. -- Pretty printers
  283. --
  284. ------------------------------------------------------------------------------
  285. -- | Draw SCNode data.
  286. drawSCNode :: SCNode -> String
  287. drawSCNode = renderSCNode True
  288. -- | Pretty prints SCNode in same format as '/g_dumpTree' OSC message.
  289. renderSCNode :: Bool -> SCNode -> String
  290. renderSCNode detail = render . n2doc where
  291. n2doc n = case n of
  292. Group i ns ->
  293. text "NODE TREE Group" <+> P.int i $$ vcat (map (nest 3 . n2doc') ns)
  294. _ -> n2doc' n
  295. n2doc' n = case n of
  296. Group i ns -> P.int i <+> text "group" $$ vcat (map (nest 3 . n2doc') ns)
  297. Synth i name ps ->
  298. P.int i <+> text name $$
  299. (if detail then hsep (map (nest 2 . p2doc) ps) else empty)
  300. p2doc p = case p of
  301. n:=v -> text n <> char ':' <+> P.double v
  302. n:<-v -> text n <> char ':' <+> char 'c' <> P.int v
  303. n:<=v -> text n <> char ':' <+> char 'a' <> P.int v
  304. -- | Dump SCNode. Dumped string could be parsed with 'read' function.
  305. prettyDump :: SCNode -> String
  306. prettyDump = render . n2doc where
  307. n2doc :: SCNode -> Doc
  308. n2doc n = case n of
  309. Group i ns ->
  310. text "Group" <+> signedInt i $$
  311. nest 2 (brackets $ vcat (punctuate comma (map n2doc ns)))
  312. Synth i name ps ->
  313. text "Synth" <+> signedInt i <+> doubleQuotes (text name) $$
  314. nest 2 (brackets $ vcat (punctuate comma (map p2doc ps)))
  315. p2doc p = case p of
  316. (k:=v) -> doubleQuotes (text k) <> text ":=" <> signedDouble v
  317. (k:<-v) -> doubleQuotes (text k) <> text ":<-" <> signedInt v
  318. (k:<=v) -> doubleQuotes (text k) <> text ":<=" <> signedInt v
  319. -- | Show signed int.
  320. signedInt :: Int -> Doc
  321. signedInt n | n < 0 = parens (P.int n)
  322. | otherwise = P.int n
  323. -- | Show signed double.
  324. signedDouble :: Double -> Doc
  325. signedDouble n | n < 0 = parens (P.double n)
  326. | otherwise = P.double n