module Monomer.Widgets.Animation.Types where
import Monomer.Core.WidgetTypes (Millisecond)
data AnimationMsg
= AnimationStart
| AnimationStop
| AnimationFinished Millisecond
deriving (AnimationMsg -> AnimationMsg -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AnimationMsg -> AnimationMsg -> Bool
$c/= :: AnimationMsg -> AnimationMsg -> Bool
== :: AnimationMsg -> AnimationMsg -> Bool
$c== :: AnimationMsg -> AnimationMsg -> Bool
Eq, Int -> AnimationMsg -> ShowS
[AnimationMsg] -> ShowS
AnimationMsg -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AnimationMsg] -> ShowS
$cshowList :: [AnimationMsg] -> ShowS
show :: AnimationMsg -> String
$cshow :: AnimationMsg -> String
showsPrec :: Int -> AnimationMsg -> ShowS
$cshowsPrec :: Int -> AnimationMsg -> ShowS
Show)