{-# LINE 1 "src/Lua/Types.hsc" #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE PatternSynonyms #-}
module Lua.Types
( State (..)
, Reader
, TypeCode (..)
, CFunction
, PreCFunction
, LuaBool (..)
, Integer (..)
, Number (..)
, StackIndex (..)
, NumArgs (..)
, NumResults (..)
, OPCode (..)
, ArithOPCode (..)
, StatusCode (..)
, GCCode (..)
)
where
import Prelude hiding (Integer)
import Data.Bifunctor (first)
import Data.Int (Int64)
{-# LINE 42 "src/Lua/Types.hsc" #-}
import Foreign.C (CChar, CInt, CSize)
import Foreign.Ptr (FunPtr, Ptr)
import Foreign.Storable (Storable)
import GHC.Generics (Generic)
newtype State = State (Ptr ()) deriving (State -> State -> Bool
(State -> State -> Bool) -> (State -> State -> Bool) -> Eq State
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: State -> State -> Bool
$c/= :: State -> State -> Bool
== :: State -> State -> Bool
$c== :: State -> State -> Bool
Eq, (forall x. State -> Rep State x)
-> (forall x. Rep State x -> State) -> Generic State
forall x. Rep State x -> State
forall x. State -> Rep State x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep State x -> State
$cfrom :: forall x. State -> Rep State x
Generic)
type CFunction = FunPtr PreCFunction
type PreCFunction = State -> IO NumResults
type Reader = FunPtr (State -> Ptr () -> Ptr CSize -> IO (Ptr CChar))
newtype Integer = Integer Int64
{-# LINE 100 "src/Lua/Types.hsc" #-}
deriving (Bounded, Enum, Eq, Integral, Num, Ord, Real)
instance Show Integer where
show :: Integer -> String
show (Integer Int64
i) = Int64 -> String
forall a. Show a => a -> String
show Int64
i
instance Read Integer where
readsPrec :: Int -> ReadS Integer
readsPrec Int
i = ((Int64, String) -> (Integer, String))
-> [(Int64, String)] -> [(Integer, String)]
forall a b. (a -> b) -> [a] -> [b]
map ((Int64 -> Integer) -> (Int64, String) -> (Integer, String)
forall (p :: * -> * -> *) a b c.
Bifunctor p =>
(a -> b) -> p a c -> p b c
first Int64 -> Integer
Integer) ([(Int64, String)] -> [(Integer, String)])
-> (String -> [(Int64, String)]) -> ReadS Integer
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> String -> [(Int64, String)]
forall a. Read a => Int -> ReadS a
readsPrec Int
i
newtype Number = Number Double
{-# LINE 116 "src/Lua/Types.hsc" #-}
deriving (Eq, Floating, Fractional, Num, Ord, Real, RealFloat, RealFrac)
instance Show Number where
show :: Number -> String
show (Number Double
n) = Double -> String
forall a. Show a => a -> String
show Double
n
instance Read Number where
readsPrec :: Int -> ReadS Number
readsPrec Int
i = ((Double, String) -> (Number, String))
-> [(Double, String)] -> [(Number, String)]
forall a b. (a -> b) -> [a] -> [b]
map ((Double -> Number) -> (Double, String) -> (Number, String)
forall (p :: * -> * -> *) a b c.
Bifunctor p =>
(a -> b) -> p a c -> p b c
first Double -> Number
Number) ([(Double, String)] -> [(Number, String)])
-> (String -> [(Double, String)]) -> ReadS Number
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> String -> [(Double, String)]
forall a. Read a => Int -> ReadS a
readsPrec Int
i
newtype LuaBool = LuaBool CInt
deriving (LuaBool -> LuaBool -> Bool
(LuaBool -> LuaBool -> Bool)
-> (LuaBool -> LuaBool -> Bool) -> Eq LuaBool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LuaBool -> LuaBool -> Bool
$c/= :: LuaBool -> LuaBool -> Bool
== :: LuaBool -> LuaBool -> Bool
$c== :: LuaBool -> LuaBool -> Bool
Eq, Ptr b -> Int -> IO LuaBool
Ptr b -> Int -> LuaBool -> IO ()
Ptr LuaBool -> IO LuaBool
Ptr LuaBool -> Int -> IO LuaBool
Ptr LuaBool -> Int -> LuaBool -> IO ()
Ptr LuaBool -> LuaBool -> IO ()
LuaBool -> Int
(LuaBool -> Int)
-> (LuaBool -> Int)
-> (Ptr LuaBool -> Int -> IO LuaBool)
-> (Ptr LuaBool -> Int -> LuaBool -> IO ())
-> (forall b. Ptr b -> Int -> IO LuaBool)
-> (forall b. Ptr b -> Int -> LuaBool -> IO ())
-> (Ptr LuaBool -> IO LuaBool)
-> (Ptr LuaBool -> LuaBool -> IO ())
-> Storable LuaBool
forall b. Ptr b -> Int -> IO LuaBool
forall b. Ptr b -> Int -> LuaBool -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr LuaBool -> LuaBool -> IO ()
$cpoke :: Ptr LuaBool -> LuaBool -> IO ()
peek :: Ptr LuaBool -> IO LuaBool
$cpeek :: Ptr LuaBool -> IO LuaBool
pokeByteOff :: Ptr b -> Int -> LuaBool -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> LuaBool -> IO ()
peekByteOff :: Ptr b -> Int -> IO LuaBool
$cpeekByteOff :: forall b. Ptr b -> Int -> IO LuaBool
pokeElemOff :: Ptr LuaBool -> Int -> LuaBool -> IO ()
$cpokeElemOff :: Ptr LuaBool -> Int -> LuaBool -> IO ()
peekElemOff :: Ptr LuaBool -> Int -> IO LuaBool
$cpeekElemOff :: Ptr LuaBool -> Int -> IO LuaBool
alignment :: LuaBool -> Int
$calignment :: LuaBool -> Int
sizeOf :: LuaBool -> Int
$csizeOf :: LuaBool -> Int
Storable, Int -> LuaBool -> ShowS
[LuaBool] -> ShowS
LuaBool -> String
(Int -> LuaBool -> ShowS)
-> (LuaBool -> String) -> ([LuaBool] -> ShowS) -> Show LuaBool
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LuaBool] -> ShowS
$cshowList :: [LuaBool] -> ShowS
show :: LuaBool -> String
$cshow :: LuaBool -> String
showsPrec :: Int -> LuaBool -> ShowS
$cshowsPrec :: Int -> LuaBool -> ShowS
Show)
newtype TypeCode = TypeCode { TypeCode -> CInt
fromTypeCode :: CInt }
deriving (TypeCode -> TypeCode -> Bool
(TypeCode -> TypeCode -> Bool)
-> (TypeCode -> TypeCode -> Bool) -> Eq TypeCode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TypeCode -> TypeCode -> Bool
$c/= :: TypeCode -> TypeCode -> Bool
== :: TypeCode -> TypeCode -> Bool
$c== :: TypeCode -> TypeCode -> Bool
Eq, Eq TypeCode
Eq TypeCode
-> (TypeCode -> TypeCode -> Ordering)
-> (TypeCode -> TypeCode -> Bool)
-> (TypeCode -> TypeCode -> Bool)
-> (TypeCode -> TypeCode -> Bool)
-> (TypeCode -> TypeCode -> Bool)
-> (TypeCode -> TypeCode -> TypeCode)
-> (TypeCode -> TypeCode -> TypeCode)
-> Ord TypeCode
TypeCode -> TypeCode -> Bool
TypeCode -> TypeCode -> Ordering
TypeCode -> TypeCode -> TypeCode
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: TypeCode -> TypeCode -> TypeCode
$cmin :: TypeCode -> TypeCode -> TypeCode
max :: TypeCode -> TypeCode -> TypeCode
$cmax :: TypeCode -> TypeCode -> TypeCode
>= :: TypeCode -> TypeCode -> Bool
$c>= :: TypeCode -> TypeCode -> Bool
> :: TypeCode -> TypeCode -> Bool
$c> :: TypeCode -> TypeCode -> Bool
<= :: TypeCode -> TypeCode -> Bool
$c<= :: TypeCode -> TypeCode -> Bool
< :: TypeCode -> TypeCode -> Bool
$c< :: TypeCode -> TypeCode -> Bool
compare :: TypeCode -> TypeCode -> Ordering
$ccompare :: TypeCode -> TypeCode -> Ordering
$cp1Ord :: Eq TypeCode
Ord, Int -> TypeCode -> ShowS
[TypeCode] -> ShowS
TypeCode -> String
(Int -> TypeCode -> ShowS)
-> (TypeCode -> String) -> ([TypeCode] -> ShowS) -> Show TypeCode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TypeCode] -> ShowS
$cshowList :: [TypeCode] -> ShowS
show :: TypeCode -> String
$cshow :: TypeCode -> String
showsPrec :: Int -> TypeCode -> ShowS
$cshowsPrec :: Int -> TypeCode -> ShowS
Show)
newtype OPCode = OPCode CInt deriving (OPCode -> OPCode -> Bool
(OPCode -> OPCode -> Bool)
-> (OPCode -> OPCode -> Bool) -> Eq OPCode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: OPCode -> OPCode -> Bool
$c/= :: OPCode -> OPCode -> Bool
== :: OPCode -> OPCode -> Bool
$c== :: OPCode -> OPCode -> Bool
Eq, Ptr b -> Int -> IO OPCode
Ptr b -> Int -> OPCode -> IO ()
Ptr OPCode -> IO OPCode
Ptr OPCode -> Int -> IO OPCode
Ptr OPCode -> Int -> OPCode -> IO ()
Ptr OPCode -> OPCode -> IO ()
OPCode -> Int
(OPCode -> Int)
-> (OPCode -> Int)
-> (Ptr OPCode -> Int -> IO OPCode)
-> (Ptr OPCode -> Int -> OPCode -> IO ())
-> (forall b. Ptr b -> Int -> IO OPCode)
-> (forall b. Ptr b -> Int -> OPCode -> IO ())
-> (Ptr OPCode -> IO OPCode)
-> (Ptr OPCode -> OPCode -> IO ())
-> Storable OPCode
forall b. Ptr b -> Int -> IO OPCode
forall b. Ptr b -> Int -> OPCode -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr OPCode -> OPCode -> IO ()
$cpoke :: Ptr OPCode -> OPCode -> IO ()
peek :: Ptr OPCode -> IO OPCode
$cpeek :: Ptr OPCode -> IO OPCode
pokeByteOff :: Ptr b -> Int -> OPCode -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> OPCode -> IO ()
peekByteOff :: Ptr b -> Int -> IO OPCode
$cpeekByteOff :: forall b. Ptr b -> Int -> IO OPCode
pokeElemOff :: Ptr OPCode -> Int -> OPCode -> IO ()
$cpokeElemOff :: Ptr OPCode -> Int -> OPCode -> IO ()
peekElemOff :: Ptr OPCode -> Int -> IO OPCode
$cpeekElemOff :: Ptr OPCode -> Int -> IO OPCode
alignment :: OPCode -> Int
$calignment :: OPCode -> Int
sizeOf :: OPCode -> Int
$csizeOf :: OPCode -> Int
Storable, Int -> OPCode -> ShowS
[OPCode] -> ShowS
OPCode -> String
(Int -> OPCode -> ShowS)
-> (OPCode -> String) -> ([OPCode] -> ShowS) -> Show OPCode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [OPCode] -> ShowS
$cshowList :: [OPCode] -> ShowS
show :: OPCode -> String
$cshow :: OPCode -> String
showsPrec :: Int -> OPCode -> ShowS
$cshowsPrec :: Int -> OPCode -> ShowS
Show)
newtype ArithOPCode = ArithOPCode CInt deriving (ArithOPCode -> ArithOPCode -> Bool
(ArithOPCode -> ArithOPCode -> Bool)
-> (ArithOPCode -> ArithOPCode -> Bool) -> Eq ArithOPCode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ArithOPCode -> ArithOPCode -> Bool
$c/= :: ArithOPCode -> ArithOPCode -> Bool
== :: ArithOPCode -> ArithOPCode -> Bool
$c== :: ArithOPCode -> ArithOPCode -> Bool
Eq, Ptr b -> Int -> IO ArithOPCode
Ptr b -> Int -> ArithOPCode -> IO ()
Ptr ArithOPCode -> IO ArithOPCode
Ptr ArithOPCode -> Int -> IO ArithOPCode
Ptr ArithOPCode -> Int -> ArithOPCode -> IO ()
Ptr ArithOPCode -> ArithOPCode -> IO ()
ArithOPCode -> Int
(ArithOPCode -> Int)
-> (ArithOPCode -> Int)
-> (Ptr ArithOPCode -> Int -> IO ArithOPCode)
-> (Ptr ArithOPCode -> Int -> ArithOPCode -> IO ())
-> (forall b. Ptr b -> Int -> IO ArithOPCode)
-> (forall b. Ptr b -> Int -> ArithOPCode -> IO ())
-> (Ptr ArithOPCode -> IO ArithOPCode)
-> (Ptr ArithOPCode -> ArithOPCode -> IO ())
-> Storable ArithOPCode
forall b. Ptr b -> Int -> IO ArithOPCode
forall b. Ptr b -> Int -> ArithOPCode -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr ArithOPCode -> ArithOPCode -> IO ()
$cpoke :: Ptr ArithOPCode -> ArithOPCode -> IO ()
peek :: Ptr ArithOPCode -> IO ArithOPCode
$cpeek :: Ptr ArithOPCode -> IO ArithOPCode
pokeByteOff :: Ptr b -> Int -> ArithOPCode -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> ArithOPCode -> IO ()
peekByteOff :: Ptr b -> Int -> IO ArithOPCode
$cpeekByteOff :: forall b. Ptr b -> Int -> IO ArithOPCode
pokeElemOff :: Ptr ArithOPCode -> Int -> ArithOPCode -> IO ()
$cpokeElemOff :: Ptr ArithOPCode -> Int -> ArithOPCode -> IO ()
peekElemOff :: Ptr ArithOPCode -> Int -> IO ArithOPCode
$cpeekElemOff :: Ptr ArithOPCode -> Int -> IO ArithOPCode
alignment :: ArithOPCode -> Int
$calignment :: ArithOPCode -> Int
sizeOf :: ArithOPCode -> Int
$csizeOf :: ArithOPCode -> Int
Storable, Int -> ArithOPCode -> ShowS
[ArithOPCode] -> ShowS
ArithOPCode -> String
(Int -> ArithOPCode -> ShowS)
-> (ArithOPCode -> String)
-> ([ArithOPCode] -> ShowS)
-> Show ArithOPCode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ArithOPCode] -> ShowS
$cshowList :: [ArithOPCode] -> ShowS
show :: ArithOPCode -> String
$cshow :: ArithOPCode -> String
showsPrec :: Int -> ArithOPCode -> ShowS
$cshowsPrec :: Int -> ArithOPCode -> ShowS
Show)
newtype StatusCode = StatusCode CInt deriving (StatusCode -> StatusCode -> Bool
(StatusCode -> StatusCode -> Bool)
-> (StatusCode -> StatusCode -> Bool) -> Eq StatusCode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: StatusCode -> StatusCode -> Bool
$c/= :: StatusCode -> StatusCode -> Bool
== :: StatusCode -> StatusCode -> Bool
$c== :: StatusCode -> StatusCode -> Bool
Eq, Ptr b -> Int -> IO StatusCode
Ptr b -> Int -> StatusCode -> IO ()
Ptr StatusCode -> IO StatusCode
Ptr StatusCode -> Int -> IO StatusCode
Ptr StatusCode -> Int -> StatusCode -> IO ()
Ptr StatusCode -> StatusCode -> IO ()
StatusCode -> Int
(StatusCode -> Int)
-> (StatusCode -> Int)
-> (Ptr StatusCode -> Int -> IO StatusCode)
-> (Ptr StatusCode -> Int -> StatusCode -> IO ())
-> (forall b. Ptr b -> Int -> IO StatusCode)
-> (forall b. Ptr b -> Int -> StatusCode -> IO ())
-> (Ptr StatusCode -> IO StatusCode)
-> (Ptr StatusCode -> StatusCode -> IO ())
-> Storable StatusCode
forall b. Ptr b -> Int -> IO StatusCode
forall b. Ptr b -> Int -> StatusCode -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr StatusCode -> StatusCode -> IO ()
$cpoke :: Ptr StatusCode -> StatusCode -> IO ()
peek :: Ptr StatusCode -> IO StatusCode
$cpeek :: Ptr StatusCode -> IO StatusCode
pokeByteOff :: Ptr b -> Int -> StatusCode -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> StatusCode -> IO ()
peekByteOff :: Ptr b -> Int -> IO StatusCode
$cpeekByteOff :: forall b. Ptr b -> Int -> IO StatusCode
pokeElemOff :: Ptr StatusCode -> Int -> StatusCode -> IO ()
$cpokeElemOff :: Ptr StatusCode -> Int -> StatusCode -> IO ()
peekElemOff :: Ptr StatusCode -> Int -> IO StatusCode
$cpeekElemOff :: Ptr StatusCode -> Int -> IO StatusCode
alignment :: StatusCode -> Int
$calignment :: StatusCode -> Int
sizeOf :: StatusCode -> Int
$csizeOf :: StatusCode -> Int
Storable, Int -> StatusCode -> ShowS
[StatusCode] -> ShowS
StatusCode -> String
(Int -> StatusCode -> ShowS)
-> (StatusCode -> String)
-> ([StatusCode] -> ShowS)
-> Show StatusCode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [StatusCode] -> ShowS
$cshowList :: [StatusCode] -> ShowS
show :: StatusCode -> String
$cshow :: StatusCode -> String
showsPrec :: Int -> StatusCode -> ShowS
$cshowsPrec :: Int -> StatusCode -> ShowS
Show)
newtype GCCode = GCCode CInt deriving (GCCode -> GCCode -> Bool
(GCCode -> GCCode -> Bool)
-> (GCCode -> GCCode -> Bool) -> Eq GCCode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GCCode -> GCCode -> Bool
$c/= :: GCCode -> GCCode -> Bool
== :: GCCode -> GCCode -> Bool
$c== :: GCCode -> GCCode -> Bool
Eq, Ptr b -> Int -> IO GCCode
Ptr b -> Int -> GCCode -> IO ()
Ptr GCCode -> IO GCCode
Ptr GCCode -> Int -> IO GCCode
Ptr GCCode -> Int -> GCCode -> IO ()
Ptr GCCode -> GCCode -> IO ()
GCCode -> Int
(GCCode -> Int)
-> (GCCode -> Int)
-> (Ptr GCCode -> Int -> IO GCCode)
-> (Ptr GCCode -> Int -> GCCode -> IO ())
-> (forall b. Ptr b -> Int -> IO GCCode)
-> (forall b. Ptr b -> Int -> GCCode -> IO ())
-> (Ptr GCCode -> IO GCCode)
-> (Ptr GCCode -> GCCode -> IO ())
-> Storable GCCode
forall b. Ptr b -> Int -> IO GCCode
forall b. Ptr b -> Int -> GCCode -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr GCCode -> GCCode -> IO ()
$cpoke :: Ptr GCCode -> GCCode -> IO ()
peek :: Ptr GCCode -> IO GCCode
$cpeek :: Ptr GCCode -> IO GCCode
pokeByteOff :: Ptr b -> Int -> GCCode -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> GCCode -> IO ()
peekByteOff :: Ptr b -> Int -> IO GCCode
$cpeekByteOff :: forall b. Ptr b -> Int -> IO GCCode
pokeElemOff :: Ptr GCCode -> Int -> GCCode -> IO ()
$cpokeElemOff :: Ptr GCCode -> Int -> GCCode -> IO ()
peekElemOff :: Ptr GCCode -> Int -> IO GCCode
$cpeekElemOff :: Ptr GCCode -> Int -> IO GCCode
alignment :: GCCode -> Int
$calignment :: GCCode -> Int
sizeOf :: GCCode -> Int
$csizeOf :: GCCode -> Int
Storable, Int -> GCCode -> ShowS
[GCCode] -> ShowS
GCCode -> String
(Int -> GCCode -> ShowS)
-> (GCCode -> String) -> ([GCCode] -> ShowS) -> Show GCCode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GCCode] -> ShowS
$cshowList :: [GCCode] -> ShowS
show :: GCCode -> String
$cshow :: GCCode -> String
showsPrec :: Int -> GCCode -> ShowS
$cshowsPrec :: Int -> GCCode -> ShowS
Show)
newtype StackIndex = StackIndex { StackIndex -> CInt
fromStackIndex :: CInt }
deriving (Int -> StackIndex
StackIndex -> Int
StackIndex -> [StackIndex]
StackIndex -> StackIndex
StackIndex -> StackIndex -> [StackIndex]
StackIndex -> StackIndex -> StackIndex -> [StackIndex]
(StackIndex -> StackIndex)
-> (StackIndex -> StackIndex)
-> (Int -> StackIndex)
-> (StackIndex -> Int)
-> (StackIndex -> [StackIndex])
-> (StackIndex -> StackIndex -> [StackIndex])
-> (StackIndex -> StackIndex -> [StackIndex])
-> (StackIndex -> StackIndex -> StackIndex -> [StackIndex])
-> Enum StackIndex
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: StackIndex -> StackIndex -> StackIndex -> [StackIndex]
$cenumFromThenTo :: StackIndex -> StackIndex -> StackIndex -> [StackIndex]
enumFromTo :: StackIndex -> StackIndex -> [StackIndex]
$cenumFromTo :: StackIndex -> StackIndex -> [StackIndex]
enumFromThen :: StackIndex -> StackIndex -> [StackIndex]
$cenumFromThen :: StackIndex -> StackIndex -> [StackIndex]
enumFrom :: StackIndex -> [StackIndex]
$cenumFrom :: StackIndex -> [StackIndex]
fromEnum :: StackIndex -> Int
$cfromEnum :: StackIndex -> Int
toEnum :: Int -> StackIndex
$ctoEnum :: Int -> StackIndex
pred :: StackIndex -> StackIndex
$cpred :: StackIndex -> StackIndex
succ :: StackIndex -> StackIndex
$csucc :: StackIndex -> StackIndex
Enum, StackIndex -> StackIndex -> Bool
(StackIndex -> StackIndex -> Bool)
-> (StackIndex -> StackIndex -> Bool) -> Eq StackIndex
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: StackIndex -> StackIndex -> Bool
$c/= :: StackIndex -> StackIndex -> Bool
== :: StackIndex -> StackIndex -> Bool
$c== :: StackIndex -> StackIndex -> Bool
Eq, Integer -> StackIndex
StackIndex -> StackIndex
StackIndex -> StackIndex -> StackIndex
(StackIndex -> StackIndex -> StackIndex)
-> (StackIndex -> StackIndex -> StackIndex)
-> (StackIndex -> StackIndex -> StackIndex)
-> (StackIndex -> StackIndex)
-> (StackIndex -> StackIndex)
-> (StackIndex -> StackIndex)
-> (Integer -> StackIndex)
-> Num StackIndex
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> StackIndex
$cfromInteger :: Integer -> StackIndex
signum :: StackIndex -> StackIndex
$csignum :: StackIndex -> StackIndex
abs :: StackIndex -> StackIndex
$cabs :: StackIndex -> StackIndex
negate :: StackIndex -> StackIndex
$cnegate :: StackIndex -> StackIndex
* :: StackIndex -> StackIndex -> StackIndex
$c* :: StackIndex -> StackIndex -> StackIndex
- :: StackIndex -> StackIndex -> StackIndex
$c- :: StackIndex -> StackIndex -> StackIndex
+ :: StackIndex -> StackIndex -> StackIndex
$c+ :: StackIndex -> StackIndex -> StackIndex
Num, Eq StackIndex
Eq StackIndex
-> (StackIndex -> StackIndex -> Ordering)
-> (StackIndex -> StackIndex -> Bool)
-> (StackIndex -> StackIndex -> Bool)
-> (StackIndex -> StackIndex -> Bool)
-> (StackIndex -> StackIndex -> Bool)
-> (StackIndex -> StackIndex -> StackIndex)
-> (StackIndex -> StackIndex -> StackIndex)
-> Ord StackIndex
StackIndex -> StackIndex -> Bool
StackIndex -> StackIndex -> Ordering
StackIndex -> StackIndex -> StackIndex
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: StackIndex -> StackIndex -> StackIndex
$cmin :: StackIndex -> StackIndex -> StackIndex
max :: StackIndex -> StackIndex -> StackIndex
$cmax :: StackIndex -> StackIndex -> StackIndex
>= :: StackIndex -> StackIndex -> Bool
$c>= :: StackIndex -> StackIndex -> Bool
> :: StackIndex -> StackIndex -> Bool
$c> :: StackIndex -> StackIndex -> Bool
<= :: StackIndex -> StackIndex -> Bool
$c<= :: StackIndex -> StackIndex -> Bool
< :: StackIndex -> StackIndex -> Bool
$c< :: StackIndex -> StackIndex -> Bool
compare :: StackIndex -> StackIndex -> Ordering
$ccompare :: StackIndex -> StackIndex -> Ordering
$cp1Ord :: Eq StackIndex
Ord, Int -> StackIndex -> ShowS
[StackIndex] -> ShowS
StackIndex -> String
(Int -> StackIndex -> ShowS)
-> (StackIndex -> String)
-> ([StackIndex] -> ShowS)
-> Show StackIndex
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [StackIndex] -> ShowS
$cshowList :: [StackIndex] -> ShowS
show :: StackIndex -> String
$cshow :: StackIndex -> String
showsPrec :: Int -> StackIndex -> ShowS
$cshowsPrec :: Int -> StackIndex -> ShowS
Show)
newtype NumArgs = NumArgs { NumArgs -> CInt
fromNumArgs :: CInt }
deriving (NumArgs -> NumArgs -> Bool
(NumArgs -> NumArgs -> Bool)
-> (NumArgs -> NumArgs -> Bool) -> Eq NumArgs
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: NumArgs -> NumArgs -> Bool
$c/= :: NumArgs -> NumArgs -> Bool
== :: NumArgs -> NumArgs -> Bool
$c== :: NumArgs -> NumArgs -> Bool
Eq, Integer -> NumArgs
NumArgs -> NumArgs
NumArgs -> NumArgs -> NumArgs
(NumArgs -> NumArgs -> NumArgs)
-> (NumArgs -> NumArgs -> NumArgs)
-> (NumArgs -> NumArgs -> NumArgs)
-> (NumArgs -> NumArgs)
-> (NumArgs -> NumArgs)
-> (NumArgs -> NumArgs)
-> (Integer -> NumArgs)
-> Num NumArgs
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> NumArgs
$cfromInteger :: Integer -> NumArgs
signum :: NumArgs -> NumArgs
$csignum :: NumArgs -> NumArgs
abs :: NumArgs -> NumArgs
$cabs :: NumArgs -> NumArgs
negate :: NumArgs -> NumArgs
$cnegate :: NumArgs -> NumArgs
* :: NumArgs -> NumArgs -> NumArgs
$c* :: NumArgs -> NumArgs -> NumArgs
- :: NumArgs -> NumArgs -> NumArgs
$c- :: NumArgs -> NumArgs -> NumArgs
+ :: NumArgs -> NumArgs -> NumArgs
$c+ :: NumArgs -> NumArgs -> NumArgs
Num, Eq NumArgs
Eq NumArgs
-> (NumArgs -> NumArgs -> Ordering)
-> (NumArgs -> NumArgs -> Bool)
-> (NumArgs -> NumArgs -> Bool)
-> (NumArgs -> NumArgs -> Bool)
-> (NumArgs -> NumArgs -> Bool)
-> (NumArgs -> NumArgs -> NumArgs)
-> (NumArgs -> NumArgs -> NumArgs)
-> Ord NumArgs
NumArgs -> NumArgs -> Bool
NumArgs -> NumArgs -> Ordering
NumArgs -> NumArgs -> NumArgs
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: NumArgs -> NumArgs -> NumArgs
$cmin :: NumArgs -> NumArgs -> NumArgs
max :: NumArgs -> NumArgs -> NumArgs
$cmax :: NumArgs -> NumArgs -> NumArgs
>= :: NumArgs -> NumArgs -> Bool
$c>= :: NumArgs -> NumArgs -> Bool
> :: NumArgs -> NumArgs -> Bool
$c> :: NumArgs -> NumArgs -> Bool
<= :: NumArgs -> NumArgs -> Bool
$c<= :: NumArgs -> NumArgs -> Bool
< :: NumArgs -> NumArgs -> Bool
$c< :: NumArgs -> NumArgs -> Bool
compare :: NumArgs -> NumArgs -> Ordering
$ccompare :: NumArgs -> NumArgs -> Ordering
$cp1Ord :: Eq NumArgs
Ord, Int -> NumArgs -> ShowS
[NumArgs] -> ShowS
NumArgs -> String
(Int -> NumArgs -> ShowS)
-> (NumArgs -> String) -> ([NumArgs] -> ShowS) -> Show NumArgs
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [NumArgs] -> ShowS
$cshowList :: [NumArgs] -> ShowS
show :: NumArgs -> String
$cshow :: NumArgs -> String
showsPrec :: Int -> NumArgs -> ShowS
$cshowsPrec :: Int -> NumArgs -> ShowS
Show)
newtype NumResults = NumResults { NumResults -> CInt
fromNumResults :: CInt }
deriving (NumResults -> NumResults -> Bool
(NumResults -> NumResults -> Bool)
-> (NumResults -> NumResults -> Bool) -> Eq NumResults
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: NumResults -> NumResults -> Bool
$c/= :: NumResults -> NumResults -> Bool
== :: NumResults -> NumResults -> Bool
$c== :: NumResults -> NumResults -> Bool
Eq, Integer -> NumResults
NumResults -> NumResults
NumResults -> NumResults -> NumResults
(NumResults -> NumResults -> NumResults)
-> (NumResults -> NumResults -> NumResults)
-> (NumResults -> NumResults -> NumResults)
-> (NumResults -> NumResults)
-> (NumResults -> NumResults)
-> (NumResults -> NumResults)
-> (Integer -> NumResults)
-> Num NumResults
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> NumResults
$cfromInteger :: Integer -> NumResults
signum :: NumResults -> NumResults
$csignum :: NumResults -> NumResults
abs :: NumResults -> NumResults
$cabs :: NumResults -> NumResults
negate :: NumResults -> NumResults
$cnegate :: NumResults -> NumResults
* :: NumResults -> NumResults -> NumResults
$c* :: NumResults -> NumResults -> NumResults
- :: NumResults -> NumResults -> NumResults
$c- :: NumResults -> NumResults -> NumResults
+ :: NumResults -> NumResults -> NumResults
$c+ :: NumResults -> NumResults -> NumResults
Num, Eq NumResults
Eq NumResults
-> (NumResults -> NumResults -> Ordering)
-> (NumResults -> NumResults -> Bool)
-> (NumResults -> NumResults -> Bool)
-> (NumResults -> NumResults -> Bool)
-> (NumResults -> NumResults -> Bool)
-> (NumResults -> NumResults -> NumResults)
-> (NumResults -> NumResults -> NumResults)
-> Ord NumResults
NumResults -> NumResults -> Bool
NumResults -> NumResults -> Ordering
NumResults -> NumResults -> NumResults
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: NumResults -> NumResults -> NumResults
$cmin :: NumResults -> NumResults -> NumResults
max :: NumResults -> NumResults -> NumResults
$cmax :: NumResults -> NumResults -> NumResults
>= :: NumResults -> NumResults -> Bool
$c>= :: NumResults -> NumResults -> Bool
> :: NumResults -> NumResults -> Bool
$c> :: NumResults -> NumResults -> Bool
<= :: NumResults -> NumResults -> Bool
$c<= :: NumResults -> NumResults -> Bool
< :: NumResults -> NumResults -> Bool
$c< :: NumResults -> NumResults -> Bool
compare :: NumResults -> NumResults -> Ordering
$ccompare :: NumResults -> NumResults -> Ordering
$cp1Ord :: Eq NumResults
Ord, Int -> NumResults -> ShowS
[NumResults] -> ShowS
NumResults -> String
(Int -> NumResults -> ShowS)
-> (NumResults -> String)
-> ([NumResults] -> ShowS)
-> Show NumResults
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [NumResults] -> ShowS
$cshowList :: [NumResults] -> ShowS
show :: NumResults -> String
$cshow :: NumResults -> String
showsPrec :: Int -> NumResults -> ShowS
$cshowsPrec :: Int -> NumResults -> ShowS
Show)