module System.Nix.Store.Remote.Types.SubstituteMode
  ( SubstituteMode(..)
  ) where

import GHC.Generics

-- | Path substitution mode, used by @queryValidPaths@
data SubstituteMode
  = SubstituteMode_DoSubstitute
  | SubstituteMode_DontSubstitute
  deriving (SubstituteMode
SubstituteMode -> SubstituteMode -> Bounded SubstituteMode
forall a. a -> a -> Bounded a
$cminBound :: SubstituteMode
minBound :: SubstituteMode
$cmaxBound :: SubstituteMode
maxBound :: SubstituteMode
Bounded, SubstituteMode -> SubstituteMode -> Bool
(SubstituteMode -> SubstituteMode -> Bool)
-> (SubstituteMode -> SubstituteMode -> Bool) -> Eq SubstituteMode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SubstituteMode -> SubstituteMode -> Bool
== :: SubstituteMode -> SubstituteMode -> Bool
$c/= :: SubstituteMode -> SubstituteMode -> Bool
/= :: SubstituteMode -> SubstituteMode -> Bool
Eq, (forall x. SubstituteMode -> Rep SubstituteMode x)
-> (forall x. Rep SubstituteMode x -> SubstituteMode)
-> Generic SubstituteMode
forall x. Rep SubstituteMode x -> SubstituteMode
forall x. SubstituteMode -> Rep SubstituteMode x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. SubstituteMode -> Rep SubstituteMode x
from :: forall x. SubstituteMode -> Rep SubstituteMode x
$cto :: forall x. Rep SubstituteMode x -> SubstituteMode
to :: forall x. Rep SubstituteMode x -> SubstituteMode
Generic, Int -> SubstituteMode
SubstituteMode -> Int
SubstituteMode -> [SubstituteMode]
SubstituteMode -> SubstituteMode
SubstituteMode -> SubstituteMode -> [SubstituteMode]
SubstituteMode
-> SubstituteMode -> SubstituteMode -> [SubstituteMode]
(SubstituteMode -> SubstituteMode)
-> (SubstituteMode -> SubstituteMode)
-> (Int -> SubstituteMode)
-> (SubstituteMode -> Int)
-> (SubstituteMode -> [SubstituteMode])
-> (SubstituteMode -> SubstituteMode -> [SubstituteMode])
-> (SubstituteMode -> SubstituteMode -> [SubstituteMode])
-> (SubstituteMode
    -> SubstituteMode -> SubstituteMode -> [SubstituteMode])
-> Enum SubstituteMode
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: SubstituteMode -> SubstituteMode
succ :: SubstituteMode -> SubstituteMode
$cpred :: SubstituteMode -> SubstituteMode
pred :: SubstituteMode -> SubstituteMode
$ctoEnum :: Int -> SubstituteMode
toEnum :: Int -> SubstituteMode
$cfromEnum :: SubstituteMode -> Int
fromEnum :: SubstituteMode -> Int
$cenumFrom :: SubstituteMode -> [SubstituteMode]
enumFrom :: SubstituteMode -> [SubstituteMode]
$cenumFromThen :: SubstituteMode -> SubstituteMode -> [SubstituteMode]
enumFromThen :: SubstituteMode -> SubstituteMode -> [SubstituteMode]
$cenumFromTo :: SubstituteMode -> SubstituteMode -> [SubstituteMode]
enumFromTo :: SubstituteMode -> SubstituteMode -> [SubstituteMode]
$cenumFromThenTo :: SubstituteMode
-> SubstituteMode -> SubstituteMode -> [SubstituteMode]
enumFromThenTo :: SubstituteMode
-> SubstituteMode -> SubstituteMode -> [SubstituteMode]
Enum, Eq SubstituteMode
Eq SubstituteMode =>
(SubstituteMode -> SubstituteMode -> Ordering)
-> (SubstituteMode -> SubstituteMode -> Bool)
-> (SubstituteMode -> SubstituteMode -> Bool)
-> (SubstituteMode -> SubstituteMode -> Bool)
-> (SubstituteMode -> SubstituteMode -> Bool)
-> (SubstituteMode -> SubstituteMode -> SubstituteMode)
-> (SubstituteMode -> SubstituteMode -> SubstituteMode)
-> Ord SubstituteMode
SubstituteMode -> SubstituteMode -> Bool
SubstituteMode -> SubstituteMode -> Ordering
SubstituteMode -> SubstituteMode -> SubstituteMode
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
$ccompare :: SubstituteMode -> SubstituteMode -> Ordering
compare :: SubstituteMode -> SubstituteMode -> Ordering
$c< :: SubstituteMode -> SubstituteMode -> Bool
< :: SubstituteMode -> SubstituteMode -> Bool
$c<= :: SubstituteMode -> SubstituteMode -> Bool
<= :: SubstituteMode -> SubstituteMode -> Bool
$c> :: SubstituteMode -> SubstituteMode -> Bool
> :: SubstituteMode -> SubstituteMode -> Bool
$c>= :: SubstituteMode -> SubstituteMode -> Bool
>= :: SubstituteMode -> SubstituteMode -> Bool
$cmax :: SubstituteMode -> SubstituteMode -> SubstituteMode
max :: SubstituteMode -> SubstituteMode -> SubstituteMode
$cmin :: SubstituteMode -> SubstituteMode -> SubstituteMode
min :: SubstituteMode -> SubstituteMode -> SubstituteMode
Ord, Int -> SubstituteMode -> ShowS
[SubstituteMode] -> ShowS
SubstituteMode -> String
(Int -> SubstituteMode -> ShowS)
-> (SubstituteMode -> String)
-> ([SubstituteMode] -> ShowS)
-> Show SubstituteMode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SubstituteMode -> ShowS
showsPrec :: Int -> SubstituteMode -> ShowS
$cshow :: SubstituteMode -> String
show :: SubstituteMode -> String
$cshowList :: [SubstituteMode] -> ShowS
showList :: [SubstituteMode] -> ShowS
Show)