-cloc|https://github.com/AlDanial/cloc v 1.66 T=0.06 s (419.0 files/s, 27927.6 lines/s)
+cloc|https://github.com/AlDanial/cloc v 1.66 T=0.05 s (517.5 files/s, 35624.7 lines/s)
--- | ---
Language|files|blank|comment|code
:-------|-------:|-------:|-------:|-------:
-Haskell|26|291|399|1043
+Haskell|26|302|384|1104
--------|--------|--------|--------|--------
-SUM:|26|291|399|1043
+SUM:|26|302|384|1104
{-# LANGUAGE Arrows, FlexibleContexts #-}
-module RCMA.Layer.Board where
+module RCMA.Layer.Board ( boardSetup
+ ) where
import Control.Concurrent
import Data.ReactiveValue
boardSF'' board ph = switch (splitE ^<< fmap swap ^<< boardSF' board ph)
(\nph -> boardSF'' board nph)
-boardInit :: Board
- -> ReactiveFieldReadWrite IO Tempo
- -> ReactiveFieldReadWrite IO Layer
- -> IO (ReactiveFieldRead IO [Note])
-boardInit board tempoRV layerRV = do
+boardSetup :: Board
+ -> ReactiveFieldReadWrite IO Tempo
+ -> ReactiveFieldReadWrite IO Layer
+ -> IO (ReactiveFieldRead IO [Note])
+boardSetup board tempoRV layerRV = do
layer <- reactiveValueRead layerRV
tempo <- reactiveValueRead tempoRV
(inBoard, outBoard) <- yampaReactiveDual (layer, tempo) (boardSF board)
+{-# LANGUAGE ScopedTypeVariables #-}
+
module Main where
+import Control.Concurrent
+import Data.ReactiveValue
import FRP.Yampa
import Hails.Yampa
+import RCMA.Layer.Board
+import RCMA.Layer.Layer
import RCMA.Semantics
import RCMA.Translator.Jack
import RCMA.Translator.Message
import RCMA.Translator.Translator
+import Control.Monad
+import Data.Ratio
+
+board =
+ makeBoard [((0,0), mkCell (ChDir False na1 N)),
+ ((0,1), mkCell (ChDir False na1 SE)),
+ ((1,1), mkCell (Split na1)),
+ ((1,-1), mkCell (Split na1)),
+ ((-1,0), mkCell (ChDir False na2 NE))]
+
+na1 = NoteAttr {
+ naArt = Accent13,
+ naDur = 1 % 4,
+ naOrn = Ornaments Nothing [] NoSlide
+ }
+
+na2 = NoteAttr {
+ naArt = NoAccent,
+ naDur = 1 % 16,
+ naOrn = Ornaments Nothing [(10, MIDICVRnd)] SlideUp
+ }
+
+na3 = NoteAttr {
+ naArt = Accent13,
+ naDur = 0,
+ naOrn = Ornaments Nothing [] NoSlide
+ }
+
+
+bpb :: Int
+bpb = 4
+
+tempoRV :: ReactiveFieldReadWrite IO Tempo
+tempoRV = ReactiveFieldReadWrite (\_ -> return ()) (return 96) (\_ -> return ())
+
+waitForChildren :: MVar [MVar ()] -> IO ()
+waitForChildren children = do
+ cs <- takeMVar children
+ case cs of
+ [] -> return ()
+ m:ms -> do
+ putMVar children ms
+ takeMVar m
+ waitForChildren children
+
main :: IO ()
main = do
- (inp, out) <- yampaReactiveDual [] rcma
- return ()
+ (children :: MVar [MVar ()]) <- newMVar []
+ let forkChild :: IO () -> IO ThreadId
+ forkChild io = do
+ mvar <- newEmptyMVar
+ childs <- takeMVar children
+ putMVar children (mvar:childs)
+ forkFinally io (\_ -> putMVar mvar ())
+
+ layerRV <- getDefaultLayerRV
+ boardInRV <- boardSetup board tempoRV layerRV
+ jackT <- forkChild $ jackSetup (liftR2 (\t n -> (t, 0, n)) tempoRV boardInRV)
+ waitForChildren children
-- Starts a default client with an input and an output port. Doesn't
-- do anything as such.
-jackSetup :: ReactiveFieldRead IO (LTempo, Int, [(Frames, RawMessage)])
+jackSetup :: ReactiveFieldRead IO (LTempo, Int, [Note])
-> IO ()
jackSetup boardInRV = Jack.handleExceptions $ do
toProcessRV <- Trans.lift $ toProcess <$> newCBMVar []
-> JMIDI.Port Jack.Input
-> JMIDI.Port Jack.Output
-> ReactiveFieldReadWrite IO [(Frames, RawMessage)]
- -> ReactiveFieldRead IO (LTempo, Int, [(Frames, RawMessage)])
+ -> ReactiveFieldRead IO (LTempo, Int, [Note])
-> Jack.NFrames
-> Sync.ExceptionalT E.Errno IO ()
jackCallBack client input output toProcessRV boardInRV
(Jack.NFrames lframeInt) <- Trans.lift $ Jack.lastFrameTime client
-- We write the content of the input buffer to the input of a
-- translation signal function.
- -- /!\ Should be moved elsewhere
+ -- /!\ Should maybe be moved elsewhere
(inRaw, outPure) <- Trans.lift $ yampaReactiveDual [] readMessages
Trans.lift (inMIDIRV =:> inRaw)
(tempo, chan, boardIn') <- Trans.lift $ reactiveValueRead boardInRV
- let boardIn = ([],[],boardIn')
+ let boardIn = (zip (repeat 0) boardIn',[],[])
outMIDI <- Trans.lift $ reactiveValueRead outPure
-- We translate all signals to be sent into low level signals and
-- write them to the output buffer.
(inPure, outRaw) <- Trans.lift $ yampaReactiveDual
(defaultTempo, sr, chan, ([],[],[])) gatherMessages
-- This should all go in its own IO action
- Trans.lift $ reactiveValueWrite inPure
- (tempo, sr, chan, (boardIn `mappend` outMIDI))
- Trans.lift (reactiveValueRead outRaw <**>
- (mappend <$> reactiveValueRead toProcessRV) >>=
- reactiveValueWrite toProcessRV)
Trans.lift $ do
+ reactiveValueWrite inPure (tempo, sr, chan, (boardIn `mappend` outMIDI))
+ reactiveValueRead outRaw <**>
+ (mappend <$> reactiveValueRead toProcessRV) >>=
+ reactiveValueWrite toProcessRV
(go, old') <- schedule nframesInt <$> reactiveValueRead toProcessRV
let old = map (BF.first (+ (- nframesInt))) old'
reactiveValueWrite outMIDIRV go