Distribution.Types.ConfVar
data ConfVar Source #
A ConfVar represents the variable type used.
ConfVar
Constructors
Defined in Distribution.Types.ConfVar
Methods
(==) :: ConfVar -> ConfVar -> Bool #
(/=) :: ConfVar -> ConfVar -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConfVar -> c ConfVar Source #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConfVar Source #
toConstr :: ConfVar -> Constr Source #
dataTypeOf :: ConfVar -> DataType Source #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConfVar) Source #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConfVar) Source #
gmapT :: (forall b. Data b => b -> b) -> ConfVar -> ConfVar Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r Source #
gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> ConfVar -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> ConfVar -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar Source #
showsPrec :: Int -> ConfVar -> ShowS Source #
show :: ConfVar -> String Source #
showList :: [ConfVar] -> ShowS Source #
Associated Types
type Rep ConfVar :: Type -> Type Source #
from :: ConfVar -> Rep ConfVar x Source #
to :: Rep ConfVar x -> ConfVar Source #
put :: ConfVar -> Put Source #
get :: Get ConfVar Source #
putList :: [ConfVar] -> Put Source #
rnf :: ConfVar -> () Source #
structure :: Proxy ConfVar -> Structure Source #
structureHash' :: Tagged ConfVar MD5