{-# OPTIONS_GHC -Wall #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  ToySolver.Converter.ObjType
-- Copyright   :  (c) Masahiro Sakai 2011-2012
-- License     :  BSD-style
--
-- Maintainer  :  masahiro.sakai@gmail.com
-- Stability   :  experimental
-- Portability :  portable
--
-----------------------------------------------------------------------------
module ToySolver.Converter.ObjType
  ( ObjType (..)
  ) where

data ObjType = ObjNone | ObjMaxOne | ObjMaxZero
  deriving (ObjType -> ObjType -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ObjType -> ObjType -> Bool
$c/= :: ObjType -> ObjType -> Bool
== :: ObjType -> ObjType -> Bool
$c== :: ObjType -> ObjType -> Bool
Eq, Eq ObjType
ObjType -> ObjType -> Bool
ObjType -> ObjType -> Ordering
ObjType -> ObjType -> ObjType
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 :: ObjType -> ObjType -> ObjType
$cmin :: ObjType -> ObjType -> ObjType
max :: ObjType -> ObjType -> ObjType
$cmax :: ObjType -> ObjType -> ObjType
>= :: ObjType -> ObjType -> Bool
$c>= :: ObjType -> ObjType -> Bool
> :: ObjType -> ObjType -> Bool
$c> :: ObjType -> ObjType -> Bool
<= :: ObjType -> ObjType -> Bool
$c<= :: ObjType -> ObjType -> Bool
< :: ObjType -> ObjType -> Bool
$c< :: ObjType -> ObjType -> Bool
compare :: ObjType -> ObjType -> Ordering
$ccompare :: ObjType -> ObjType -> Ordering
Ord, Int -> ObjType
ObjType -> Int
ObjType -> [ObjType]
ObjType -> ObjType
ObjType -> ObjType -> [ObjType]
ObjType -> ObjType -> ObjType -> [ObjType]
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 :: ObjType -> ObjType -> ObjType -> [ObjType]
$cenumFromThenTo :: ObjType -> ObjType -> ObjType -> [ObjType]
enumFromTo :: ObjType -> ObjType -> [ObjType]
$cenumFromTo :: ObjType -> ObjType -> [ObjType]
enumFromThen :: ObjType -> ObjType -> [ObjType]
$cenumFromThen :: ObjType -> ObjType -> [ObjType]
enumFrom :: ObjType -> [ObjType]
$cenumFrom :: ObjType -> [ObjType]
fromEnum :: ObjType -> Int
$cfromEnum :: ObjType -> Int
toEnum :: Int -> ObjType
$ctoEnum :: Int -> ObjType
pred :: ObjType -> ObjType
$cpred :: ObjType -> ObjType
succ :: ObjType -> ObjType
$csucc :: ObjType -> ObjType
Enum, ObjType
forall a. a -> a -> Bounded a
maxBound :: ObjType
$cmaxBound :: ObjType
minBound :: ObjType
$cminBound :: ObjType
Bounded, Int -> ObjType -> ShowS
[ObjType] -> ShowS
ObjType -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ObjType] -> ShowS
$cshowList :: [ObjType] -> ShowS
show :: ObjType -> String
$cshow :: ObjType -> String
showsPrec :: Int -> ObjType -> ShowS
$cshowsPrec :: Int -> ObjType -> ShowS
Show)