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