module Music.Time.Event (
Event,
event,
eventee,
spanEvent,
triple
) where
import Control.Applicative
import Control.Comonad
import Control.Lens hiding (Indexable, Level, above,
below, index, inside, parts,
reversed, transform, (<|), (|>))
import Control.Monad (join, mapM)
import Control.Monad.Compose
import Data.Distributive (distribute)
import Data.Foldable (Foldable)
import qualified Data.Foldable as Foldable
import Data.Functor.Classes
import Data.Functor.Compose
import Data.Functor.Couple
import Data.PairMonad
import Data.Semigroup
import Data.String
import Data.Typeable
import Data.VectorSpace
import Data.Aeson (ToJSON (..))
import qualified Data.Aeson as JSON
import Music.Dynamics.Literal
import Music.Pitch.Literal
import Music.Time.Internal.Util (dependingOn, through, tripped)
import Music.Time.Juxtapose
import Music.Time.Meta
#ifndef GHCI
instance Traversable AddMeta where
traverse = annotated
instance Eq1 AddMeta where
eq1 = (==)
instance Eq a => Eq1 (Couple a) where
eq1 = (==)
instance Ord1 AddMeta where
compare1 = compare
instance Ord a => Ord1 (Couple a) where
compare1 = compare
instance Num (f (g a)) => Num (Compose f g a) where
Compose a + Compose b = Compose (a + b)
Compose a Compose b = Compose (a b)
Compose a * Compose b = Compose (a * b)
signum (Compose a) = Compose (signum a)
abs (Compose a) = Compose (abs a)
fromInteger = Compose . fromInteger
instance Fractional (f (g a)) => Fractional (Compose f g a) where
Compose a / Compose b = Compose (a / b)
fromRational = Compose . fromRational
instance Floating (f (g a)) => Floating (Compose f g a) where
instance (Real (f (g a)), Ord1 f, Ord1 g, Ord a, Functor f) => Real (Compose f g a) where
instance (RealFrac (f (g a)), Ord1 f, Ord1 g, Ord a, Functor f) => RealFrac (Compose f g a) where
instance (Functor f, Monad f, Monad g, Traversable g) => Monad (Compose f g) where
return = Compose . return . return
xs >>= f = Compose $ mbind (getCompose . f) (getCompose xs)
instance (Comonad f, Comonad g) => Comonad (Compose f g) where
extract (Compose f) = (extract . extract) f
duplicate = error "No Comonad Compose.duplicate (in Music.Time.Event)"
#endif
newtype Event a = Event { getEvent :: Compose AddMeta (Couple Span) a }
deriving (Eq, Ord, Typeable, Foldable, Applicative, Monad, Traversable,
Functor, Num, Fractional, Floating, Real, RealFrac)
instance Wrapped (Event a) where
type Unwrapped (Event a) = AddMeta (Span, a)
_Wrapped' = iso (fmap getCouple . getCompose . getEvent) (Event . Compose . fmap Couple)
instance Rewrapped (Event a) (Event b)
instance Transformable (Event a) where
transform t = over eventSpan (transform t)
instance HasDuration (Event a) where
_duration = _duration . _era
instance HasPosition (Event a) where
_era = view eventSpan
instance HasMeta (Event a) where
meta = _Wrapped . meta
instance IsString a => IsString (Event a) where
fromString = pure . fromString
instance IsPitch a => IsPitch (Event a) where
fromPitch = pure . fromPitch
instance IsInterval a => IsInterval (Event a) where
fromInterval = pure . fromInterval
instance IsDynamics a => IsDynamics (Event a) where
fromDynamics = pure . fromDynamics
instance (Show a, Transformable a) => Show (Event a) where
show x = show (x^.from event) ++ "^.event"
instance ToJSON a => ToJSON (Event a) where
toJSON a = JSON.object [ ("span", toJSON s), ("value", toJSON x) ]
where
(s, x) = a^.from event
instance Comonad Event where
extract e = e^.eventValue
duplicate e = set meta (e^.meta) $ (e^.eventSpan,e)^.event
event :: Iso (Span, a) (Span, b) (Event a) (Event b)
event = from (_Wrapped . unsafeAnnotated)
eventSpan :: Lens' (Event a) Span
eventSpan = from event . _1
eventValue :: Lens (Event a) (Event b) a b
eventValue = from event . _2
eventee :: (Transformable a, Transformable b) => Lens (Event a) (Event b) a b
eventee = from event `dependingOn` (transformed)
spanEvent :: Iso' Span (Event ())
spanEvent = iso (\s -> (s,())^.event) (^.era)
triple :: Iso (Event a) (Event b) (Time, Duration, a) (Time, Duration, b)
triple = from event . bimapping delta id . tripped