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