Source codeContentsIndex
Graphics.UI.ObjectIO.StdIOBasic
Portabilityportable
Stabilityprovisional
Maintainerka2_mail@yahoo.com
Description
StdIOBasic defines basic types and access functions for the I/O library.
Synopsis
class Zero a where
zero :: a
class One a where
one :: a
class Toggle a where
toggle :: a -> a
data Tup t1 t2 = (:^:) t1 t2
data TupSt t1 t2 ps = (:~:) (t1 ps) (t2 ps)
data ListCS t ps = ListCS [t ps]
data NilCS ps = NilCS
data TupLS t1 t2 ls ps = (:+:) (t1 ls ps) (t2 ls ps)
data ListLS t ls ps = ListLS [t ls ps]
data NilLS ls ps = NilLS
data NewLS t ls ps = forall new . NewLS new (t new ps)
data AddLS t ls ps = forall add . AddLS add (t (add, ls) ps)
type Index = Int
type Title = String
data Vector2 = Vector2 {
vx :: !Int
vy :: !Int
}
class ToVector x where
toVector :: x -> Vector2
data Size = Size {
w :: !Int
h :: !Int
}
data Point2 = Point2 {
x :: !Int
y :: !Int
}
data Rectangle = Rectangle {
corner1 :: !Point2
corner2 :: !Point2
}
rectangleSize :: Rectangle -> Size
movePoint :: Vector2 -> Point2 -> Point2
type IdFun st = st -> st
class Monad m => IOMonad m where
liftIO :: IO a -> m a
Documentation
class Zero a where
Methods
zero :: a
show/hide Instances
class One a where
Methods
one :: a
class Toggle a where
Methods
toggle :: a -> a
show/hide Instances
data Tup t1 t2
Constructors
(:^:) t1 t2
show/hide Instances
(ToRegion area1, ToRegion area2) => ToRegion (Tup area1 area2)
data TupSt t1 t2 ps
Constructors
(:~:) (t1 ps) (t2 ps)
data ListCS t ps
Constructors
ListCS [t ps]
data NilCS ps
Constructors
NilCS
data TupLS t1 t2 ls ps
Constructors
(:+:) (t1 ls ps) (t2 ls ps)
show/hide Instances
data ListLS t ls ps
Constructors
ListLS [t ls ps]
show/hide Instances
data NilLS ls ps
Constructors
NilLS
show/hide Instances
data NewLS t ls ps
Constructors
forall new . NewLS new (t new ps)
show/hide Instances
data AddLS t ls ps
Constructors
forall add . AddLS add (t (add, ls) ps)
show/hide Instances
type Index = Int
type Title = String
data Vector2
Constructors
Vector2
vx :: !Int
vy :: !Int
show/hide Instances
class ToVector x where
Methods
toVector :: x -> Vector2
show/hide Instances
data Size
Constructors
Size
w :: !Int
h :: !Int
show/hide Instances
data Point2
Constructors
Point2
x :: !Int
y :: !Int
show/hide Instances
data Rectangle
Constructors
Rectangle
corner1 :: !Point2
corner2 :: !Point2
show/hide Instances
rectangleSize :: Rectangle -> Size
movePoint :: Vector2 -> Point2 -> Point2
type IdFun st = st -> st
class Monad m => IOMonad m where
IOMonad class is a simply way to call IO actions from IO-like monads. There are instances for IO, Draw and GUI.
Methods
liftIO :: IO a -> m a
show/hide Instances
Produced by Haddock version 0.8