module System.Process.Quick.Predicate.ImplDir where import System.Process.Quick.Prelude data ImplDir (localDirPath :: Symbol) deriving (Typeable (ImplDir localDirPath) Typeable (ImplDir localDirPath) => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImplDir localDirPath -> c (ImplDir localDirPath)) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImplDir localDirPath)) -> (ImplDir localDirPath -> Constr) -> (ImplDir localDirPath -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImplDir localDirPath))) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImplDir localDirPath))) -> ((forall b. Data b => b -> b) -> ImplDir localDirPath -> ImplDir localDirPath) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r) -> (forall u. (forall d. Data d => d -> u) -> ImplDir localDirPath -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> ImplDir localDirPath -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath)) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath)) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath)) -> Data (ImplDir localDirPath) ImplDir localDirPath -> Constr ImplDir localDirPath -> DataType (forall b. Data b => b -> b) -> ImplDir localDirPath -> ImplDir localDirPath forall a. Typeable a => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> a -> c a) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c a) -> (a -> Constr) -> (a -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c a)) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a)) -> ((forall b. Data b => b -> b) -> a -> a) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall u. (forall d. Data d => d -> u) -> a -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> Data a forall u. Int -> (forall d. Data d => d -> u) -> ImplDir localDirPath -> u forall u. (forall d. Data d => d -> u) -> ImplDir localDirPath -> [u] forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r forall (localDirPath :: Symbol). KnownSymbol localDirPath => Typeable (ImplDir localDirPath) forall (localDirPath :: Symbol). KnownSymbol localDirPath => ImplDir localDirPath -> Constr forall (localDirPath :: Symbol). KnownSymbol localDirPath => ImplDir localDirPath -> DataType forall (localDirPath :: Symbol). KnownSymbol localDirPath => (forall b. Data b => b -> b) -> ImplDir localDirPath -> ImplDir localDirPath forall (localDirPath :: Symbol) u. KnownSymbol localDirPath => Int -> (forall d. Data d => d -> u) -> ImplDir localDirPath -> u forall (localDirPath :: Symbol) u. KnownSymbol localDirPath => (forall d. Data d => d -> u) -> ImplDir localDirPath -> [u] forall (localDirPath :: Symbol) r r'. KnownSymbol localDirPath => (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r forall (localDirPath :: Symbol) r r'. KnownSymbol localDirPath => (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r forall (localDirPath :: Symbol) (m :: * -> *). (KnownSymbol localDirPath, Monad m) => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) forall (localDirPath :: Symbol) (m :: * -> *). (KnownSymbol localDirPath, MonadPlus m) => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) forall (localDirPath :: Symbol) (c :: * -> *). KnownSymbol localDirPath => (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImplDir localDirPath) forall (localDirPath :: Symbol) (c :: * -> *). KnownSymbol localDirPath => (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImplDir localDirPath -> c (ImplDir localDirPath) forall (localDirPath :: Symbol) (t :: * -> *) (c :: * -> *). (KnownSymbol localDirPath, Typeable t) => (forall d. Data d => c (t d)) -> Maybe (c (ImplDir localDirPath)) forall (localDirPath :: Symbol) (t :: * -> * -> *) (c :: * -> *). (KnownSymbol localDirPath, Typeable t) => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImplDir localDirPath)) forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImplDir localDirPath) forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImplDir localDirPath -> c (ImplDir localDirPath) forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImplDir localDirPath)) forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImplDir localDirPath)) $cgfoldl :: forall (localDirPath :: Symbol) (c :: * -> *). KnownSymbol localDirPath => (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImplDir localDirPath -> c (ImplDir localDirPath) gfoldl :: forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImplDir localDirPath -> c (ImplDir localDirPath) $cgunfold :: forall (localDirPath :: Symbol) (c :: * -> *). KnownSymbol localDirPath => (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImplDir localDirPath) gunfold :: forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImplDir localDirPath) $ctoConstr :: forall (localDirPath :: Symbol). KnownSymbol localDirPath => ImplDir localDirPath -> Constr toConstr :: ImplDir localDirPath -> Constr $cdataTypeOf :: forall (localDirPath :: Symbol). KnownSymbol localDirPath => ImplDir localDirPath -> DataType dataTypeOf :: ImplDir localDirPath -> DataType $cdataCast1 :: forall (localDirPath :: Symbol) (t :: * -> *) (c :: * -> *). (KnownSymbol localDirPath, Typeable t) => (forall d. Data d => c (t d)) -> Maybe (c (ImplDir localDirPath)) dataCast1 :: forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImplDir localDirPath)) $cdataCast2 :: forall (localDirPath :: Symbol) (t :: * -> * -> *) (c :: * -> *). (KnownSymbol localDirPath, Typeable t) => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImplDir localDirPath)) dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImplDir localDirPath)) $cgmapT :: forall (localDirPath :: Symbol). KnownSymbol localDirPath => (forall b. Data b => b -> b) -> ImplDir localDirPath -> ImplDir localDirPath gmapT :: (forall b. Data b => b -> b) -> ImplDir localDirPath -> ImplDir localDirPath $cgmapQl :: forall (localDirPath :: Symbol) r r'. KnownSymbol localDirPath => (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r gmapQl :: forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r $cgmapQr :: forall (localDirPath :: Symbol) r r'. KnownSymbol localDirPath => (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImplDir localDirPath -> r $cgmapQ :: forall (localDirPath :: Symbol) u. KnownSymbol localDirPath => (forall d. Data d => d -> u) -> ImplDir localDirPath -> [u] gmapQ :: forall u. (forall d. Data d => d -> u) -> ImplDir localDirPath -> [u] $cgmapQi :: forall (localDirPath :: Symbol) u. KnownSymbol localDirPath => Int -> (forall d. Data d => d -> u) -> ImplDir localDirPath -> u gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> ImplDir localDirPath -> u $cgmapM :: forall (localDirPath :: Symbol) (m :: * -> *). (KnownSymbol localDirPath, Monad m) => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) gmapM :: forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) $cgmapMp :: forall (localDirPath :: Symbol) (m :: * -> *). (KnownSymbol localDirPath, MonadPlus m) => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) gmapMp :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) $cgmapMo :: forall (localDirPath :: Symbol) (m :: * -> *). (KnownSymbol localDirPath, MonadPlus m) => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) gmapMo :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> ImplDir localDirPath -> m (ImplDir localDirPath) Data, Int -> ImplDir localDirPath -> ShowS [ImplDir localDirPath] -> ShowS ImplDir localDirPath -> String (Int -> ImplDir localDirPath -> ShowS) -> (ImplDir localDirPath -> String) -> ([ImplDir localDirPath] -> ShowS) -> Show (ImplDir localDirPath) forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a forall (localDirPath :: Symbol). Int -> ImplDir localDirPath -> ShowS forall (localDirPath :: Symbol). [ImplDir localDirPath] -> ShowS forall (localDirPath :: Symbol). ImplDir localDirPath -> String $cshowsPrec :: forall (localDirPath :: Symbol). Int -> ImplDir localDirPath -> ShowS showsPrec :: Int -> ImplDir localDirPath -> ShowS $cshow :: forall (localDirPath :: Symbol). ImplDir localDirPath -> String show :: ImplDir localDirPath -> String $cshowList :: forall (localDirPath :: Symbol). [ImplDir localDirPath] -> ShowS showList :: [ImplDir localDirPath] -> ShowS Show, ImplDir localDirPath -> ImplDir localDirPath -> Bool (ImplDir localDirPath -> ImplDir localDirPath -> Bool) -> (ImplDir localDirPath -> ImplDir localDirPath -> Bool) -> Eq (ImplDir localDirPath) forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a forall (localDirPath :: Symbol). ImplDir localDirPath -> ImplDir localDirPath -> Bool $c== :: forall (localDirPath :: Symbol). ImplDir localDirPath -> ImplDir localDirPath -> Bool == :: ImplDir localDirPath -> ImplDir localDirPath -> Bool $c/= :: forall (localDirPath :: Symbol). ImplDir localDirPath -> ImplDir localDirPath -> Bool /= :: ImplDir localDirPath -> ImplDir localDirPath -> Bool Eq, (forall x. ImplDir localDirPath -> Rep (ImplDir localDirPath) x) -> (forall x. Rep (ImplDir localDirPath) x -> ImplDir localDirPath) -> Generic (ImplDir localDirPath) forall x. Rep (ImplDir localDirPath) x -> ImplDir localDirPath forall x. ImplDir localDirPath -> Rep (ImplDir localDirPath) x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a forall (localDirPath :: Symbol) x. Rep (ImplDir localDirPath) x -> ImplDir localDirPath forall (localDirPath :: Symbol) x. ImplDir localDirPath -> Rep (ImplDir localDirPath) x $cfrom :: forall (localDirPath :: Symbol) x. ImplDir localDirPath -> Rep (ImplDir localDirPath) x from :: forall x. ImplDir localDirPath -> Rep (ImplDir localDirPath) x $cto :: forall (localDirPath :: Symbol) x. Rep (ImplDir localDirPath) x -> ImplDir localDirPath to :: forall x. Rep (ImplDir localDirPath) x -> ImplDir localDirPath Generic)