Distribution.Types.ExecutableScope
data ExecutableScope Source #
Constructors
Defined in Distribution.Types.ExecutableScope
Methods
(==) :: ExecutableScope -> ExecutableScope -> Bool #
(/=) :: ExecutableScope -> ExecutableScope -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExecutableScope -> c ExecutableScope Source #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExecutableScope Source #
toConstr :: ExecutableScope -> Constr Source #
dataTypeOf :: ExecutableScope -> DataType Source #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExecutableScope) Source #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExecutableScope) Source #
gmapT :: (forall b. Data b => b -> b) -> ExecutableScope -> ExecutableScope Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r Source #
gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> ExecutableScope -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> ExecutableScope -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope Source #
readsPrec :: Int -> ReadS ExecutableScope Source #
readList :: ReadS [ExecutableScope] Source #
readPrec :: ReadPrec ExecutableScope Source #
readListPrec :: ReadPrec [ExecutableScope] Source #
showsPrec :: Int -> ExecutableScope -> ShowS Source #
show :: ExecutableScope -> String Source #
showList :: [ExecutableScope] -> ShowS Source #
Associated Types
type Rep ExecutableScope :: Type -> Type Source #
from :: ExecutableScope -> Rep ExecutableScope x Source #
to :: Rep ExecutableScope x -> ExecutableScope Source #
Any like semigroup, where ExecutablePrivate is 'Any True'
Any
ExecutablePrivate
(<>) :: ExecutableScope -> ExecutableScope -> ExecutableScope Source #
sconcat :: NonEmpty ExecutableScope -> ExecutableScope Source #
stimes :: Integral b => b -> ExecutableScope -> ExecutableScope Source #
mempty = ExecutablePublic
mempty
ExecutablePublic
mempty :: ExecutableScope Source #
mappend :: ExecutableScope -> ExecutableScope -> ExecutableScope Source #
mconcat :: [ExecutableScope] -> ExecutableScope Source #
put :: ExecutableScope -> Put Source #
get :: Get ExecutableScope Source #
putList :: [ExecutableScope] -> Put Source #
rnf :: ExecutableScope -> () Source #
structure :: Proxy ExecutableScope -> Structure Source #
structureHash' :: Tagged ExecutableScope MD5
pretty :: ExecutableScope -> Doc Source #
prettyVersioned :: CabalSpecVersion -> ExecutableScope -> Doc Source #
parsec :: CabalParsing m => m ExecutableScope Source #