module Sound.SC3.Common.Enum where
data Loop t =
NoLoop
| Loop
| WithLoop t
deriving (Loop t -> Loop t -> Bool
(Loop t -> Loop t -> Bool)
-> (Loop t -> Loop t -> Bool) -> Eq (Loop t)
forall t. Eq t => Loop t -> Loop t -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Loop t -> Loop t -> Bool
$c/= :: forall t. Eq t => Loop t -> Loop t -> Bool
== :: Loop t -> Loop t -> Bool
$c== :: forall t. Eq t => Loop t -> Loop t -> Bool
Eq, Int -> Loop t -> ShowS
[Loop t] -> ShowS
Loop t -> String
(Int -> Loop t -> ShowS)
-> (Loop t -> String) -> ([Loop t] -> ShowS) -> Show (Loop t)
forall t. Show t => Int -> Loop t -> ShowS
forall t. Show t => [Loop t] -> ShowS
forall t. Show t => Loop t -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Loop t] -> ShowS
$cshowList :: forall t. Show t => [Loop t] -> ShowS
show :: Loop t -> String
$cshow :: forall t. Show t => Loop t -> String
showsPrec :: Int -> Loop t -> ShowS
$cshowsPrec :: forall t. Show t => Int -> Loop t -> ShowS
Show)
loop_coerce :: (t -> u) -> Loop t -> Loop u
loop_coerce :: (t -> u) -> Loop t -> Loop u
loop_coerce t -> u
f Loop t
lp =
case Loop t
lp of
Loop t
NoLoop -> Loop u
forall t. Loop t
NoLoop
Loop t
Loop -> Loop u
forall t. Loop t
Loop
WithLoop t
t -> u -> Loop u
forall t. t -> Loop t
WithLoop (t -> u
f t
t)
instance Functor Loop where
fmap :: (a -> b) -> Loop a -> Loop b
fmap = (a -> b) -> Loop a -> Loop b
forall a b. (a -> b) -> Loop a -> Loop b
loop_coerce
from_loop :: Num t => Loop t -> t
from_loop :: Loop t -> t
from_loop Loop t
e =
case Loop t
e of
Loop t
NoLoop -> t
0
Loop t
Loop -> t
1
WithLoop t
u -> t
u
data Interpolation t =
NoInterpolation
| LinearInterpolation
| CubicInterpolation
| WithInterpolation t
deriving (Interpolation t -> Interpolation t -> Bool
(Interpolation t -> Interpolation t -> Bool)
-> (Interpolation t -> Interpolation t -> Bool)
-> Eq (Interpolation t)
forall t. Eq t => Interpolation t -> Interpolation t -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Interpolation t -> Interpolation t -> Bool
$c/= :: forall t. Eq t => Interpolation t -> Interpolation t -> Bool
== :: Interpolation t -> Interpolation t -> Bool
$c== :: forall t. Eq t => Interpolation t -> Interpolation t -> Bool
Eq, Int -> Interpolation t -> ShowS
[Interpolation t] -> ShowS
Interpolation t -> String
(Int -> Interpolation t -> ShowS)
-> (Interpolation t -> String)
-> ([Interpolation t] -> ShowS)
-> Show (Interpolation t)
forall t. Show t => Int -> Interpolation t -> ShowS
forall t. Show t => [Interpolation t] -> ShowS
forall t. Show t => Interpolation t -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Interpolation t] -> ShowS
$cshowList :: forall t. Show t => [Interpolation t] -> ShowS
show :: Interpolation t -> String
$cshow :: forall t. Show t => Interpolation t -> String
showsPrec :: Int -> Interpolation t -> ShowS
$cshowsPrec :: forall t. Show t => Int -> Interpolation t -> ShowS
Show)
from_interpolation :: Num t => Interpolation t -> t
from_interpolation :: Interpolation t -> t
from_interpolation Interpolation t
e =
case Interpolation t
e of
Interpolation t
NoInterpolation -> t
1
Interpolation t
LinearInterpolation -> t
2
Interpolation t
CubicInterpolation -> t
4
WithInterpolation t
u -> t
u
data DoneAction t
= DoNothing
| PauseSynth
| RemoveSynth
| RemoveGroup
| WithDoneAction t
deriving (DoneAction t -> DoneAction t -> Bool
(DoneAction t -> DoneAction t -> Bool)
-> (DoneAction t -> DoneAction t -> Bool) -> Eq (DoneAction t)
forall t. Eq t => DoneAction t -> DoneAction t -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DoneAction t -> DoneAction t -> Bool
$c/= :: forall t. Eq t => DoneAction t -> DoneAction t -> Bool
== :: DoneAction t -> DoneAction t -> Bool
$c== :: forall t. Eq t => DoneAction t -> DoneAction t -> Bool
Eq, Int -> DoneAction t -> ShowS
[DoneAction t] -> ShowS
DoneAction t -> String
(Int -> DoneAction t -> ShowS)
-> (DoneAction t -> String)
-> ([DoneAction t] -> ShowS)
-> Show (DoneAction t)
forall t. Show t => Int -> DoneAction t -> ShowS
forall t. Show t => [DoneAction t] -> ShowS
forall t. Show t => DoneAction t -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DoneAction t] -> ShowS
$cshowList :: forall t. Show t => [DoneAction t] -> ShowS
show :: DoneAction t -> String
$cshow :: forall t. Show t => DoneAction t -> String
showsPrec :: Int -> DoneAction t -> ShowS
$cshowsPrec :: forall t. Show t => Int -> DoneAction t -> ShowS
Show)
done_action_coerce :: (t -> u) -> DoneAction t -> DoneAction u
done_action_coerce :: (t -> u) -> DoneAction t -> DoneAction u
done_action_coerce t -> u
f DoneAction t
e =
case DoneAction t
e of
DoneAction t
DoNothing -> DoneAction u
forall t. DoneAction t
DoNothing
DoneAction t
PauseSynth -> DoneAction u
forall t. DoneAction t
PauseSynth
DoneAction t
RemoveSynth -> DoneAction u
forall t. DoneAction t
RemoveSynth
DoneAction t
RemoveGroup -> DoneAction u
forall t. DoneAction t
RemoveGroup
WithDoneAction t
x -> u -> DoneAction u
forall t. t -> DoneAction t
WithDoneAction (t -> u
f t
x)
instance Functor DoneAction where
fmap :: (a -> b) -> DoneAction a -> DoneAction b
fmap = (a -> b) -> DoneAction a -> DoneAction b
forall a b. (a -> b) -> DoneAction a -> DoneAction b
done_action_coerce
from_done_action :: Num t => DoneAction t -> t
from_done_action :: DoneAction t -> t
from_done_action DoneAction t
e =
case DoneAction t
e of
DoneAction t
DoNothing -> t
0
DoneAction t
PauseSynth -> t
1
DoneAction t
RemoveSynth -> t
2
DoneAction t
RemoveGroup -> t
14
WithDoneAction t
x -> t
x
data Warp t =
Linear
| Exponential
| WithWarp t
deriving (Warp t -> Warp t -> Bool
(Warp t -> Warp t -> Bool)
-> (Warp t -> Warp t -> Bool) -> Eq (Warp t)
forall t. Eq t => Warp t -> Warp t -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Warp t -> Warp t -> Bool
$c/= :: forall t. Eq t => Warp t -> Warp t -> Bool
== :: Warp t -> Warp t -> Bool
$c== :: forall t. Eq t => Warp t -> Warp t -> Bool
Eq, Int -> Warp t -> ShowS
[Warp t] -> ShowS
Warp t -> String
(Int -> Warp t -> ShowS)
-> (Warp t -> String) -> ([Warp t] -> ShowS) -> Show (Warp t)
forall t. Show t => Int -> Warp t -> ShowS
forall t. Show t => [Warp t] -> ShowS
forall t. Show t => Warp t -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Warp t] -> ShowS
$cshowList :: forall t. Show t => [Warp t] -> ShowS
show :: Warp t -> String
$cshow :: forall t. Show t => Warp t -> String
showsPrec :: Int -> Warp t -> ShowS
$cshowsPrec :: forall t. Show t => Int -> Warp t -> ShowS
Show)
from_warp :: Num t => Warp t -> t
from_warp :: Warp t -> t
from_warp Warp t
e =
case Warp t
e of
Warp t
Linear -> t
0
Warp t
Exponential -> t
1
WithWarp t
u -> t
u
warp_coerce :: (t -> u) -> Warp t -> Warp u
warp_coerce :: (t -> u) -> Warp t -> Warp u
warp_coerce t -> u
f Warp t
e =
case Warp t
e of
Warp t
Linear -> Warp u
forall t. Warp t
Linear
Warp t
Exponential -> Warp u
forall t. Warp t
Exponential
WithWarp t
u -> u -> Warp u
forall t. t -> Warp t
WithWarp (t -> u
f t
u)
instance Functor Warp where
fmap :: (a -> b) -> Warp a -> Warp b
fmap = (a -> b) -> Warp a -> Warp b
forall a b. (a -> b) -> Warp a -> Warp b
warp_coerce
data Buffer t =
Buffer_Id Int
| Buffer t
deriving (Buffer t -> Buffer t -> Bool
(Buffer t -> Buffer t -> Bool)
-> (Buffer t -> Buffer t -> Bool) -> Eq (Buffer t)
forall t. Eq t => Buffer t -> Buffer t -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Buffer t -> Buffer t -> Bool
$c/= :: forall t. Eq t => Buffer t -> Buffer t -> Bool
== :: Buffer t -> Buffer t -> Bool
$c== :: forall t. Eq t => Buffer t -> Buffer t -> Bool
Eq, Int -> Buffer t -> ShowS
[Buffer t] -> ShowS
Buffer t -> String
(Int -> Buffer t -> ShowS)
-> (Buffer t -> String) -> ([Buffer t] -> ShowS) -> Show (Buffer t)
forall t. Show t => Int -> Buffer t -> ShowS
forall t. Show t => [Buffer t] -> ShowS
forall t. Show t => Buffer t -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Buffer t] -> ShowS
$cshowList :: forall t. Show t => [Buffer t] -> ShowS
show :: Buffer t -> String
$cshow :: forall t. Show t => Buffer t -> String
showsPrec :: Int -> Buffer t -> ShowS
$cshowsPrec :: forall t. Show t => Int -> Buffer t -> ShowS
Show)