quick-process
Safe HaskellNone
LanguageGHC2024

System.Process.Quick

Documentation

data family HList (l :: [Type]) infixr 2 #

Instances

Instances details
(SameLengths '[x, y, xy], HZipList x y xy) => HUnzip HList x y xy 
Instance details

Defined in Data.HList.HList

Methods

hUnzip :: HList xy -> (HList x, HList y) #

(SameLengths '[x, y, xy], HZipList x y xy) => HZip HList x y xy 
Instance details

Defined in Data.HList.HList

Methods

hZip :: HList x -> HList y -> HList xy #

HMapAux HList f ('[] :: [Type]) ('[] :: [Type]) 
Instance details

Defined in Data.HList.HList

Methods

hMapAux :: f -> HList ('[] :: [Type]) -> HList ('[] :: [Type]) #

(HSpanEqBy f a as fst snd, HGroupBy f snd gs) => HGroupBy (f :: t) (a ': as) (HList (a ': fst) ': gs) 
Instance details

Defined in Data.HList.HList

Methods

hGroupBy :: Proxy f -> HList (a ': as) -> HList (HList (a ': fst) ': gs) #

(ApplyAB f e e', HMapAux HList f l l', SameLength l l') => HMapAux HList f (e ': l) (e' ': l') 
Instance details

Defined in Data.HList.HList

Methods

hMapAux :: f -> HList (e ': l) -> HList (e' ': l') #

HReverse l l' => HBuild' l (HList l') 
Instance details

Defined in Data.HList.HList

Methods

hBuild' :: HList l -> HList l' #

HExtend e (HList l) 
Instance details

Defined in Data.HList.HList

Associated Types

type HExtendR e (HList l) 
Instance details

Defined in Data.HList.HList

type HExtendR e (HList l) = HList (e ': l)

Methods

(.*.) :: e -> HList l -> HExtendR e (HList l) #

HInits1 a b => HInits a (HList ('[] :: [Type]) ': b) 
Instance details

Defined in Data.HList.HList

Methods

hInits :: HList a -> HList (HList ('[] :: [Type]) ': b) #

(TypeRepsList (HList xs), Typeable x) => TypeRepsList (HList (x ': xs)) 
Instance details

Defined in Data.HList.Data

Methods

typeRepsList :: HList (x ': xs) -> [TypeRep] #

TypeRepsList (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.Data

Methods

typeRepsList :: HList ('[] :: [Type]) -> [TypeRep] #

(HProxies a, HMapCxt HList ConstMempty (AddProxy a) a, HZip HList a a aa, HMapCxt HList UncurryMappend aa a) => Monoid (HList a)

Analogous to the Monoid instance for tuples

>>> import Data.Monoid
>>> mempty :: HList '[(), All, [Int]]
H[(),All {getAll = True},[]]
>>> mappend (hBuild "a") (hBuild "b") :: HList '[String]
H["ab"]
Instance details

Defined in Data.HList.HList

Methods

mempty :: HList a #

mappend :: HList a -> HList a -> HList a #

mconcat :: [HList a] -> HList a #

(HZip HList a a aa, HMapCxt HList UncurryMappend aa a) => Semigroup (HList a) 
Instance details

Defined in Data.HList.HList

Methods

(<>) :: HList a -> HList a -> HList a #

sconcat :: NonEmpty (HList a) -> HList a #

stimes :: Integral b => b -> HList a -> HList a #

(Bounded x, Bounded (HList xs)) => Bounded (HList (x ': xs)) 
Instance details

Defined in Data.HList.HList

Methods

minBound :: HList (x ': xs) #

maxBound :: HList (x ': xs) #

Bounded (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

minBound :: HList ('[] :: [Type]) #

maxBound :: HList ('[] :: [Type]) #

(Ix x, Ix (HList xs)) => Ix (HList (x ': xs)) 
Instance details

Defined in Data.HList.HList

Methods

range :: (HList (x ': xs), HList (x ': xs)) -> [HList (x ': xs)] #

index :: (HList (x ': xs), HList (x ': xs)) -> HList (x ': xs) -> Int #

unsafeIndex :: (HList (x ': xs), HList (x ': xs)) -> HList (x ': xs) -> Int #

inRange :: (HList (x ': xs), HList (x ': xs)) -> HList (x ': xs) -> Bool #

rangeSize :: (HList (x ': xs), HList (x ': xs)) -> Int #

unsafeRangeSize :: (HList (x ': xs), HList (x ': xs)) -> Int #

Ix (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

range :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> [HList ('[] :: [Type])] #

index :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> HList ('[] :: [Type]) -> Int #

unsafeIndex :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> HList ('[] :: [Type]) -> Int #

inRange :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> HList ('[] :: [Type]) -> Bool #

rangeSize :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> Int #

unsafeRangeSize :: (HList ('[] :: [Type]), HList ('[] :: [Type])) -> Int #

(HProxies l, Read e, HSequence ReadP (ReadP e ': readP_l) (e ': l), HMapCxt HList ReadElement (AddProxy l) readP_l) => Read (HList (e ': l)) 
Instance details

Defined in Data.HList.HList

Methods

readsPrec :: Int -> ReadS (HList (e ': l)) #

readList :: ReadS [HList (e ': l)] #

readPrec :: ReadPrec (HList (e ': l)) #

readListPrec :: ReadPrec [HList (e ': l)] #

Read (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

readsPrec :: Int -> ReadS (HList ('[] :: [Type])) #

readList :: ReadS [HList ('[] :: [Type])] #

readPrec :: ReadPrec (HList ('[] :: [Type])) #

readListPrec :: ReadPrec [HList ('[] :: [Type])] #

(Show e, Show (HList l)) => Show (HList (e ': l)) 
Instance details

Defined in Data.HList.HList

Methods

showsPrec :: Int -> HList (e ': l) -> ShowS #

show :: HList (e ': l) -> String #

showList :: [HList (e ': l)] -> ShowS #

Show (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

showsPrec :: Int -> HList ('[] :: [Type]) -> ShowS #

show :: HList ('[] :: [Type]) -> String #

showList :: [HList ('[] :: [Type])] -> ShowS #

(Eq x, Eq (HList xs)) => Eq (HList (x ': xs)) 
Instance details

Defined in Data.HList.HList

Methods

(==) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

(/=) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

Eq (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

(==) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

(/=) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

(Ord x, Ord (HList xs)) => Ord (HList (x ': xs)) 
Instance details

Defined in Data.HList.HList

Methods

compare :: HList (x ': xs) -> HList (x ': xs) -> Ordering #

(<) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

(<=) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

(>) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

(>=) :: HList (x ': xs) -> HList (x ': xs) -> Bool #

max :: HList (x ': xs) -> HList (x ': xs) -> HList (x ': xs) #

min :: HList (x ': xs) -> HList (x ': xs) -> HList (x ': xs) #

Ord (HList ('[] :: [Type])) 
Instance details

Defined in Data.HList.HList

Methods

compare :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Ordering #

(<) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

(<=) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

(>) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

(>=) :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> Bool #

max :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> HList ('[] :: [Type]) #

min :: HList ('[] :: [Type]) -> HList ('[] :: [Type]) -> HList ('[] :: [Type]) #

HAppendList l1 l2 => HAppend (HList l1) (HList l2) 
Instance details

Defined in Data.HList.HList

Methods

hAppend :: HList l1 -> HList l2 -> HAppendR (HList l1) (HList l2) #

ApplyAB f e e' => ApplyAB (MapCar f) (e, HList l) (HList (e' ': l)) 
Instance details

Defined in Data.HList.HList

Methods

applyAB :: MapCar f -> (e, HList l) -> HList (e' ': l) #

HInits1 ('[] :: [Type]) '[HList ('[] :: [Type])] 
Instance details

Defined in Data.HList.HList

Methods

hInits1 :: HList ('[] :: [Type]) -> HList '[HList ('[] :: [Type])] #

HTails ('[] :: [Type]) '[HList ('[] :: [Type])] 
Instance details

Defined in Data.HList.HList

Methods

hTails :: HList ('[] :: [Type]) -> HList '[HList ('[] :: [Type])] #

(ch ~ Proxy (HBoolEQ sel (KMember n ns)), Apply (ch, FHUProj sel ns) (HList (e ': l), Proxy n)) => Apply (FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

Associated Types

type ApplyR (FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (FHUProj sel ns) (HList (e ': l), Proxy n) = ApplyR (Proxy (HBoolEQ sel (KMember n ns)), FHUProj sel ns) (HList (e ': l), Proxy n)

Methods

apply :: FHUProj sel ns -> (HList (e ': l), Proxy n) -> ApplyR (FHUProj sel ns) (HList (e ': l), Proxy n) #

Apply (FHUProj sel ns) (HList ('[] :: [Type]), n) 
Instance details

Defined in Data.HList.HArray

Associated Types

type ApplyR (FHUProj sel ns) (HList ('[] :: [Type]), n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (FHUProj sel ns) (HList ('[] :: [Type]), n) = HNothing

Methods

apply :: FHUProj sel ns -> (HList ('[] :: [Type]), n) -> ApplyR (FHUProj sel ns) (HList ('[] :: [Type]), n) #

Apply (FHUProj sel ns) (HList l, Proxy ('HSucc n)) => Apply (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

Associated Types

type ApplyR (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) = ApplyR (FHUProj sel ns) (HList l, Proxy ('HSucc n))

Methods

apply :: (Proxy 'False, FHUProj sel ns) -> (HList (e ': l), Proxy n) -> ApplyR (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) #

Apply (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

Associated Types

type ApplyR (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) = HJust (e, (HList l, Proxy ('HSucc n)))

Methods

apply :: (Proxy 'True, FHUProj sel ns) -> (HList (e ': l), Proxy n) -> ApplyR (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) #

(HConcatFD as bs, HAppendFD a bs cs) => HConcatFD (HList a ': as) cs 
Instance details

Defined in Data.HList.HList

Methods

hConcatFD :: HList (HList a ': as) -> HList cs #

(HInits1 xs ys, HMapCxt HList (FHCons2 x) ys ys', HMapCons x ys ~ ys', HMapTail ys' ~ ys) => HInits1 (x ': xs) (HList '[x] ': ys') 
Instance details

Defined in Data.HList.HList

Methods

hInits1 :: HList (x ': xs) -> HList (HList '[x] ': ys') #

HTails xs ys => HTails (x ': xs) (HList (x ': xs) ': ys) 
Instance details

Defined in Data.HList.HList

Methods

hTails :: HList (x ': xs) -> HList (HList (x ': xs) ': ys) #

HMapUnboxF xs us => HMapUnboxF (HList x ': xs) (RecordU x ': us) 
Instance details

Defined in Data.HList.RecordU

(HList (x ': y) ~ z, HZip3 xs ys zs) => HZip3 (x ': xs) (HList y ': ys) (z ': zs) 
Instance details

Defined in Data.HList.HZip

Methods

hZip3 :: HList (x ': xs) -> HList (HList y ': ys) -> HList (z ': zs) #

type HExtendR e (HList l) 
Instance details

Defined in Data.HList.HList

type HExtendR e (HList l) = HList (e ': l)
type HAppendR (HList l1 :: Type) (HList l2 :: Type) 
Instance details

Defined in Data.HList.HList

type HAppendR (HList l1 :: Type) (HList l2 :: Type) = HList (HAppendListR l1 l2)
type HMapCons x (HList a ': b) 
Instance details

Defined in Data.HList.HList

type HMapCons x (HList a ': b) = HList (x ': a) ': HMapCons x b
data HList ('[] :: [Type]) 
Instance details

Defined in Data.HList.HList

data HList ('[] :: [Type]) = HNil
type UnHList (HList a) 
Instance details

Defined in Data.HList.HList

type UnHList (HList a) = a
type ApplyR (FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (FHUProj sel ns) (HList (e ': l), Proxy n) = ApplyR (Proxy (HBoolEQ sel (KMember n ns)), FHUProj sel ns) (HList (e ': l), Proxy n)
type ApplyR (FHUProj sel ns) (HList ('[] :: [Type]), n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (FHUProj sel ns) (HList ('[] :: [Type]), n) = HNothing
type ApplyR (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (Proxy 'False, FHUProj sel ns) (HList (e ': l), Proxy n) = ApplyR (FHUProj sel ns) (HList l, Proxy ('HSucc n))
type ApplyR (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) 
Instance details

Defined in Data.HList.HArray

type ApplyR (Proxy 'True, FHUProj sel ns) (HList (e ': l), Proxy n) = HJust (e, (HList l, Proxy ('HSucc n)))
data HList (x ': xs) 
Instance details

Defined in Data.HList.HList

data HList (x ': xs) = x `HCons` (HList xs)
type HMapTail (HList (a ': as) ': bs) 
Instance details

Defined in Data.HList.HList

type HMapTail (HList (a ': as) ': bs) = HList as ': HMapTail bs

data Refined (p :: k) x #

Instances

Instances details
RefinedInArgLocator (Refined InDir FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

RefinedInArgLocator (Refined (InFile e) FilePath :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedInArgLocator (Refined (InFile e) (NeList FilePath) :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedInArgLocator (Refined (InFile e) [FilePath] :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedOutArgLocator (Refined (OutFile e) FilePath :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Lift x => Lift (Refined p x :: Type) 
Instance details

Defined in Refined.Unsafe.Type

Methods

lift :: Quote m => Refined p x -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Refined p x -> Code m (Refined p x) #

Foldable (Refined p) 
Instance details

Defined in Refined.Unsafe.Type

Methods

fold :: Monoid m => Refined p m -> m #

foldMap :: Monoid m => (a -> m) -> Refined p a -> m #

foldMap' :: Monoid m => (a -> m) -> Refined p a -> m #

foldr :: (a -> b -> b) -> b -> Refined p a -> b #

foldr' :: (a -> b -> b) -> b -> Refined p a -> b #

foldl :: (b -> a -> b) -> b -> Refined p a -> b #

foldl' :: (b -> a -> b) -> b -> Refined p a -> b #

foldr1 :: (a -> a -> a) -> Refined p a -> a #

foldl1 :: (a -> a -> a) -> Refined p a -> a #

toList :: Refined p a -> [a] #

null :: Refined p a -> Bool #

length :: Refined p a -> Int #

elem :: Eq a => a -> Refined p a -> Bool #

maximum :: Ord a => Refined p a -> a #

minimum :: Ord a => Refined p a -> a #

sum :: Num a => Refined p a -> a #

product :: Num a => Refined p a -> a #

Arbitrary (Refined InDir FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

KnownSymbol e => Arbitrary (Refined (InFile e) FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Arbitrary (Refined (InFile e) (NeList FilePath)) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Arbitrary (Refined (InFile e) [FilePath]) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Arbitrary (Refined (OutFile e) FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol p => Arbitrary (Refined (Regex p) String) Source # 
Instance details

Defined in System.Process.Quick.Predicate.Regex

(Arbitrary a, Typeable a, Predicate (SizeEqualTo n) [a], KnownNat n) => Arbitrary (Refined (SizeEqualTo n) [a]) Source # 
Instance details

Defined in System.Process.Quick.Predicate.LowerCase

Methods

arbitrary :: Gen (Refined (SizeEqualTo n) [a]) #

shrink :: Refined (SizeEqualTo n) [a] -> [Refined (SizeEqualTo n) [a]] #

NFData x => NFData (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

rnf :: Refined p x -> () #

(Typeable p, Typeable k, Data x) => Data (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Refined p x -> c (Refined p x) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Refined p x) #

toConstr :: Refined p x -> Constr #

dataTypeOf :: Refined p x -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Refined p x)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Refined p x)) #

gmapT :: (forall b. Data b => b -> b) -> Refined p x -> Refined p x #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Refined p x -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Refined p x -> r #

gmapQ :: (forall d. Data d => d -> u) -> Refined p x -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Refined p x -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Refined p x -> m (Refined p x) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Refined p x -> m (Refined p x) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Refined p x -> m (Refined p x) #

Show x => Show (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

showsPrec :: Int -> Refined p x -> ShowS #

show :: Refined p x -> String #

showList :: [Refined p x] -> ShowS #

Eq x => Eq (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

(==) :: Refined p x -> Refined p x -> Bool #

(/=) :: Refined p x -> Refined p x -> Bool #

Ord x => Ord (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

compare :: Refined p x -> Refined p x -> Ordering #

(<) :: Refined p x -> Refined p x -> Bool #

(<=) :: Refined p x -> Refined p x -> Bool #

(>) :: Refined p x -> Refined p x -> Bool #

(>=) :: Refined p x -> Refined p x -> Bool #

max :: Refined p x -> Refined p x -> Refined p x #

min :: Refined p x -> Refined p x -> Refined p x #

Hashable x => Hashable (Refined p x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

hashWithSalt :: Int -> Refined p x -> Int #

hash :: Refined p x -> Int #

(Typeable a, Predicate c a, CallArgument a) => CallArgument (Refined c a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: Refined c a -> [String] Source #

(.*.) :: HExtend e l => e -> l -> HExtendR e l infixr 2 #

type NonPositive = To 0 #

type NonNegative = From 0 #

data And (l :: k) (r :: k1) #

Constructors

And 

Instances

Instances details
Generic1 (And l :: k1 -> Type) 
Instance details

Defined in Refined

Associated Types

type Rep1 (And l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (And l :: k1 -> Type) = D1 ('MetaData "And" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: k1 -> Type))

Methods

from1 :: forall (a :: k1). And l a -> Rep1 (And l :: k1 -> Type) a #

to1 :: forall (a :: k1). Rep1 (And l :: k1 -> Type) a -> And l a #

(Predicate l x, Predicate r x) => Predicate (And l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (And l r) -> x -> Maybe RefineException #

(Typeable l, Typeable r, Typeable k1, Typeable k2) => Data (And l r) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> And l r -> c (And l r) #

gunfold :: (forall b r0. Data b => c (b -> r0) -> c r0) -> (forall r1. r1 -> c r1) -> Constr -> c (And l r) #

toConstr :: And l r -> Constr #

dataTypeOf :: And l r -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (And l r)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (And l r)) #

gmapT :: (forall b. Data b => b -> b) -> And l r -> And l r #

gmapQl :: (r0 -> r' -> r0) -> r0 -> (forall d. Data d => d -> r') -> And l r -> r0 #

gmapQr :: forall r0 r'. (r' -> r0 -> r0) -> r0 -> (forall d. Data d => d -> r') -> And l r -> r0 #

gmapQ :: (forall d. Data d => d -> u) -> And l r -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> And l r -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> And l r -> m (And l r) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> And l r -> m (And l r) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> And l r -> m (And l r) #

Generic (And l r) 
Instance details

Defined in Refined

Associated Types

type Rep (And l r) 
Instance details

Defined in Refined

type Rep (And l r) = D1 ('MetaData "And" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: And l r -> Rep (And l r) x #

to :: Rep (And l r) x -> And l r #

type Rep1 (And l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (And l :: k1 -> Type) = D1 ('MetaData "And" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: k1 -> Type))
type Rep (And l r) 
Instance details

Defined in Refined

type Rep (And l r) = D1 ('MetaData "And" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: Type -> Type))

type (&&) = And :: k -> k1 -> Type #

type (||) = Or :: k -> k1 -> Type #

data Not (p :: k) #

Constructors

Not 

Instances

Instances details
Generic1 (Not :: k -> Type) 
Instance details

Defined in Refined

Associated Types

type Rep1 (Not :: k -> Type) 
Instance details

Defined in Refined

type Rep1 (Not :: k -> Type) = D1 ('MetaData "Not" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Not" 'PrefixI 'False) (U1 :: k -> Type))

Methods

from1 :: forall (a :: k). Not a -> Rep1 (Not :: k -> Type) a #

to1 :: forall (a :: k). Rep1 (Not :: k -> Type) a -> Not a #

Predicate p x => Predicate (Not p :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Not p) -> x -> Maybe RefineException #

(Typeable p, Typeable k) => Data (Not p) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Not p -> c (Not p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Not p) #

toConstr :: Not p -> Constr #

dataTypeOf :: Not p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Not p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Not p)) #

gmapT :: (forall b. Data b => b -> b) -> Not p -> Not p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Not p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Not p -> r #

gmapQ :: (forall d. Data d => d -> u) -> Not p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Not p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Not p -> m (Not p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Not p -> m (Not p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Not p -> m (Not p) #

Generic (Not p) 
Instance details

Defined in Refined

Associated Types

type Rep (Not p) 
Instance details

Defined in Refined

type Rep (Not p) = D1 ('MetaData "Not" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Not" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Not p -> Rep (Not p) x #

to :: Rep (Not p) x -> Not p #

type Rep1 (Not :: k -> Type) 
Instance details

Defined in Refined

type Rep1 (Not :: k -> Type) = D1 ('MetaData "Not" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Not" 'PrefixI 'False) (U1 :: k -> Type))
type Rep (Not p) 
Instance details

Defined in Refined

type Rep (Not p) = D1 ('MetaData "Not" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Not" 'PrefixI 'False) (U1 :: Type -> Type))

data Xor (l :: k) (r :: k1) #

Constructors

Xor 

Instances

Instances details
Generic1 (Xor l :: k1 -> Type) 
Instance details

Defined in Refined

Associated Types

type Rep1 (Xor l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (Xor l :: k1 -> Type) = D1 ('MetaData "Xor" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Xor" 'PrefixI 'False) (U1 :: k1 -> Type))

Methods

from1 :: forall (a :: k1). Xor l a -> Rep1 (Xor l :: k1 -> Type) a #

to1 :: forall (a :: k1). Rep1 (Xor l :: k1 -> Type) a -> Xor l a #

(Predicate l x, Predicate r x) => Predicate (Xor l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Xor l r) -> x -> Maybe RefineException #

(Typeable l, Typeable r, Typeable k1, Typeable k2) => Data (Xor l r) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Xor l r -> c (Xor l r) #

gunfold :: (forall b r0. Data b => c (b -> r0) -> c r0) -> (forall r1. r1 -> c r1) -> Constr -> c (Xor l r) #

toConstr :: Xor l r -> Constr #

dataTypeOf :: Xor l r -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Xor l r)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Xor l r)) #

gmapT :: (forall b. Data b => b -> b) -> Xor l r -> Xor l r #

gmapQl :: (r0 -> r' -> r0) -> r0 -> (forall d. Data d => d -> r') -> Xor l r -> r0 #

gmapQr :: forall r0 r'. (r' -> r0 -> r0) -> r0 -> (forall d. Data d => d -> r') -> Xor l r -> r0 #

gmapQ :: (forall d. Data d => d -> u) -> Xor l r -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Xor l r -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Xor l r -> m (Xor l r) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Xor l r -> m (Xor l r) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Xor l r -> m (Xor l r) #

Generic (Xor l r) 
Instance details

Defined in Refined

Associated Types

type Rep (Xor l r) 
Instance details

Defined in Refined

type Rep (Xor l r) = D1 ('MetaData "Xor" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Xor" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Xor l r -> Rep (Xor l r) x #

to :: Rep (Xor l r) x -> Xor l r #

type Rep1 (Xor l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (Xor l :: k1 -> Type) = D1 ('MetaData "Xor" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Xor" 'PrefixI 'False) (U1 :: k1 -> Type))
type Rep (Xor l r) 
Instance details

Defined in Refined

type Rep (Xor l r) = D1 ('MetaData "Xor" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Xor" 'PrefixI 'False) (U1 :: Type -> Type))

class (Typeable p, Typeable k) => Predicate (p :: k) x where #

Methods

validate :: Proxy p -> x -> Maybe RefineException #

Instances

Instances details
Predicate InDir FilePath Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Predicate LowerCase String Source # 
Instance details

Defined in System.Process.Quick.Predicate.LowerCase

Integral x => Predicate Even x 
Instance details

Defined in Refined

Predicate IdPred x 
Instance details

Defined in Refined

RealFloat x => Predicate Infinite x 
Instance details

Defined in Refined

RealFloat x => Predicate NaN x 
Instance details

Defined in Refined

Integral x => Predicate Odd x 
Instance details

Defined in Refined

(Foldable t, Ord a) => Predicate Ascending (t a) 
Instance details

Defined in Refined

(Foldable t, Ord a) => Predicate Descending (t a) 
Instance details

Defined in Refined

KnownSymbol e => Predicate (InFile e :: Type) String Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Predicate (OutFile e :: Type) String Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol s => Predicate (Regex s :: Type) String Source # 
Instance details

Defined in System.Process.Quick.Predicate.Regex

(Integral x, KnownNat n) => Predicate (DivisibleBy n :: Type) x 
Instance details

Defined in Refined

(Eq x, Num x, KnownNat n) => Predicate (EqualTo n :: Type) x 
Instance details

Defined in Refined

(Ord x, Num x, KnownNat n) => Predicate (From n :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (From n) -> x -> Maybe RefineException #

(Ord x, Num x, KnownNat n) => Predicate (GreaterThan n :: Type) x 
Instance details

Defined in Refined

(Ord x, Num x, KnownNat n) => Predicate (LessThan n :: Type) x 
Instance details

Defined in Refined

(Eq x, Num x, KnownNat n) => Predicate (NotEqualTo n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) Text 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) Text 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeLessThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeLessThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeLessThan n :: Type) Text 
Instance details

Defined in Refined

(Ord x, Num x, KnownNat n) => Predicate (To n :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (To n) -> x -> Maybe RefineException #

Predicate (InFile e) String => Predicate (InFile e :: Type) (NeList String) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Predicate (InFile e) String => Predicate (InFile e :: Type) [String] Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

(Foldable t, KnownNat n) => Predicate (SizeEqualTo n :: Type) (t a) 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate (SizeGreaterThan n :: Type) (t a) 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate (SizeLessThan n :: Type) (t a) 
Instance details

Defined in Refined

(Ord x, Num x, KnownNat mn, KnownNat mx, mn <= mx) => Predicate (FromTo mn mx :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (FromTo mn mx) -> x -> Maybe RefineException #

(Ord x, Num x, KnownNat n, KnownNat m) => Predicate (NegativeFromTo n m :: Type) x 
Instance details

Defined in Refined

Predicate p x => Predicate (Not p :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Not p) -> x -> Maybe RefineException #

(Predicate l x, Predicate r x) => Predicate (And l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (And l r) -> x -> Maybe RefineException #

(Predicate l x, Predicate r x) => Predicate (Or l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Or l r) -> x -> Maybe RefineException #

(Predicate l x, Predicate r x) => Predicate (Xor l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Xor l r) -> x -> Maybe RefineException #

data Infinite #

Constructors

Infinite 

Instances

Instances details
Data Infinite 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Infinite -> c Infinite #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Infinite #

toConstr :: Infinite -> Constr #

dataTypeOf :: Infinite -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Infinite) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Infinite) #

gmapT :: (forall b. Data b => b -> b) -> Infinite -> Infinite #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Infinite -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Infinite -> r #

gmapQ :: (forall d. Data d => d -> u) -> Infinite -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Infinite -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Infinite -> m Infinite #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Infinite -> m Infinite #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Infinite -> m Infinite #

Generic Infinite 
Instance details

Defined in Refined

Associated Types

type Rep Infinite 
Instance details

Defined in Refined

type Rep Infinite = D1 ('MetaData "Infinite" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Infinite" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Infinite -> Rep Infinite x #

to :: Rep Infinite x -> Infinite #

RealFloat x => Predicate Infinite x 
Instance details

Defined in Refined

type Rep Infinite 
Instance details

Defined in Refined

type Rep Infinite = D1 ('MetaData "Infinite" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Infinite" 'PrefixI 'False) (U1 :: Type -> Type))

data Or (l :: k) (r :: k1) #

Constructors

Or 

Instances

Instances details
Generic1 (Or l :: k1 -> Type) 
Instance details

Defined in Refined

Associated Types

type Rep1 (Or l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (Or l :: k1 -> Type) = D1 ('MetaData "Or" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Or" 'PrefixI 'False) (U1 :: k1 -> Type))

Methods

from1 :: forall (a :: k1). Or l a -> Rep1 (Or l :: k1 -> Type) a #

to1 :: forall (a :: k1). Rep1 (Or l :: k1 -> Type) a -> Or l a #

(Predicate l x, Predicate r x) => Predicate (Or l r :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (Or l r) -> x -> Maybe RefineException #

(Typeable l, Typeable r, Typeable k1, Typeable k2) => Data (Or l r) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Or l r -> c (Or l r) #

gunfold :: (forall b r0. Data b => c (b -> r0) -> c r0) -> (forall r1. r1 -> c r1) -> Constr -> c (Or l r) #

toConstr :: Or l r -> Constr #

dataTypeOf :: Or l r -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Or l r)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Or l r)) #

gmapT :: (forall b. Data b => b -> b) -> Or l r -> Or l r #

gmapQl :: (r0 -> r' -> r0) -> r0 -> (forall d. Data d => d -> r') -> Or l r -> r0 #

gmapQr :: forall r0 r'. (r' -> r0 -> r0) -> r0 -> (forall d. Data d => d -> r') -> Or l r -> r0 #

gmapQ :: (forall d. Data d => d -> u) -> Or l r -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Or l r -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Or l r -> m (Or l r) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Or l r -> m (Or l r) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Or l r -> m (Or l r) #

Generic (Or l r) 
Instance details

Defined in Refined

Associated Types

type Rep (Or l r) 
Instance details

Defined in Refined

type Rep (Or l r) = D1 ('MetaData "Or" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Or" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Or l r -> Rep (Or l r) x #

to :: Rep (Or l r) x -> Or l r #

type Rep1 (Or l :: k1 -> Type) 
Instance details

Defined in Refined

type Rep1 (Or l :: k1 -> Type) = D1 ('MetaData "Or" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Or" 'PrefixI 'False) (U1 :: k1 -> Type))
type Rep (Or l r) 
Instance details

Defined in Refined

type Rep (Or l r) = D1 ('MetaData "Or" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Or" 'PrefixI 'False) (U1 :: Type -> Type))

data From (n :: Nat) #

Constructors

From 

Instances

Instances details
m <= n => Weaken (From n :: Type) (From m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (From n) x -> Refined (From m) x #

m <= n => Weaken (GreaterThan n :: Type) (From m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (GreaterThan n) x -> Refined (From m) x #

p <= n => Weaken (FromTo n m :: Type) (From p :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (From p) x #

(Ord x, Num x, KnownNat n) => Predicate (From n :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (From n) -> x -> Maybe RefineException #

KnownNat n => Data (From n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> From n -> c (From n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (From n) #

toConstr :: From n -> Constr #

dataTypeOf :: From n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (From n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (From n)) #

gmapT :: (forall b. Data b => b -> b) -> From n -> From n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> From n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> From n -> r #

gmapQ :: (forall d. Data d => d -> u) -> From n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> From n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> From n -> m (From n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> From n -> m (From n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> From n -> m (From n) #

Generic (From n) 
Instance details

Defined in Refined

Associated Types

type Rep (From n) 
Instance details

Defined in Refined

type Rep (From n) = D1 ('MetaData "From" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "From" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: From n -> Rep (From n) x #

to :: Rep (From n) x -> From n #

type Rep (From n) 
Instance details

Defined in Refined

type Rep (From n) = D1 ('MetaData "From" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "From" 'PrefixI 'False) (U1 :: Type -> Type))

data FromTo (mn :: Nat) (mx :: Nat) #

Constructors

FromTo 

Instances

Instances details
p <= n => Weaken (FromTo n m :: Type) (From p :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (From p) x #

m <= q => Weaken (FromTo n m :: Type) (To q :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (To q) x #

(p <= n, m <= q) => Weaken (FromTo n m :: Type) (FromTo p q :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (FromTo p q) x #

(Ord x, Num x, KnownNat mn, KnownNat mx, mn <= mx) => Predicate (FromTo mn mx :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (FromTo mn mx) -> x -> Maybe RefineException #

(KnownNat mn, KnownNat mx) => Data (FromTo mn mx) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FromTo mn mx -> c (FromTo mn mx) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FromTo mn mx) #

toConstr :: FromTo mn mx -> Constr #

dataTypeOf :: FromTo mn mx -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FromTo mn mx)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FromTo mn mx)) #

gmapT :: (forall b. Data b => b -> b) -> FromTo mn mx -> FromTo mn mx #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FromTo mn mx -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FromTo mn mx -> r #

gmapQ :: (forall d. Data d => d -> u) -> FromTo mn mx -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FromTo mn mx -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FromTo mn mx -> m (FromTo mn mx) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FromTo mn mx -> m (FromTo mn mx) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FromTo mn mx -> m (FromTo mn mx) #

Generic (FromTo mn mx) 
Instance details

Defined in Refined

Associated Types

type Rep (FromTo mn mx) 
Instance details

Defined in Refined

type Rep (FromTo mn mx) = D1 ('MetaData "FromTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "FromTo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: FromTo mn mx -> Rep (FromTo mn mx) x #

to :: Rep (FromTo mn mx) x -> FromTo mn mx #

type Rep (FromTo mn mx) 
Instance details

Defined in Refined

type Rep (FromTo mn mx) = D1 ('MetaData "FromTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "FromTo" 'PrefixI 'False) (U1 :: Type -> Type))

class (Typeable p, Typeable k1) => Predicate1 (p :: k1) (f :: k -> Type) where #

Methods

validate1 :: forall (a :: k). Proxy p -> f a -> Maybe RefineException #

Instances

Instances details
(Foldable t, KnownNat n) => Predicate1 (SizeEqualTo n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate1 (SizeGreaterThan n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate1 (SizeLessThan n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

data RefineException #

Instances

Instances details
Exception RefineException 
Instance details

Defined in Refined

Generic RefineException 
Instance details

Defined in Refined

Associated Types

type Rep RefineException 
Instance details

Defined in Refined

type Rep RefineException = D1 ('MetaData "RefineException" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) ((C1 ('MetaCons "RefineNotException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep)) :+: (C1 ('MetaCons "RefineAndException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_andChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (These RefineException RefineException))) :+: C1 ('MetaCons "RefineOrException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: (S1 ('MetaSel ('Just "_RefineException_orLChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RefineException) :*: S1 ('MetaSel ('Just "_RefineException_orRChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RefineException))))) :+: (C1 ('MetaCons "RefineXorException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_children") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (RefineException, RefineException)))) :+: (C1 ('MetaCons "RefineSomeException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_Exception") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SomeException)) :+: C1 ('MetaCons "RefineOtherException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_message") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Text)))))
Show RefineException 
Instance details

Defined in Refined

type Rep RefineException 
Instance details

Defined in Refined

type Rep RefineException = D1 ('MetaData "RefineException" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) ((C1 ('MetaCons "RefineNotException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep)) :+: (C1 ('MetaCons "RefineAndException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_andChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (These RefineException RefineException))) :+: C1 ('MetaCons "RefineOrException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: (S1 ('MetaSel ('Just "_RefineException_orLChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RefineException) :*: S1 ('MetaSel ('Just "_RefineException_orRChild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RefineException))))) :+: (C1 ('MetaCons "RefineXorException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_children") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (RefineException, RefineException)))) :+: (C1 ('MetaCons "RefineSomeException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_Exception") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SomeException)) :+: C1 ('MetaCons "RefineOtherException" 'PrefixI 'True) (S1 ('MetaSel ('Just "_RefineException_typeRep") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Just "_RefineException_message") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Text)))))

class Weaken (from :: k) (to :: k1) where #

Minimal complete definition

Nothing

Methods

weaken :: Refined from x -> Refined to x #

Instances

Instances details
m <= n => Weaken (From n :: Type) (From m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (From n) x -> Refined (From m) x #

m <= n => Weaken (GreaterThan n :: Type) (From m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (GreaterThan n) x -> Refined (From m) x #

m <= n => Weaken (GreaterThan n :: Type) (GreaterThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (GreaterThan n) x -> Refined (GreaterThan m) x #

n <= m => Weaken (LessThan n :: Type) (LessThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (LessThan n) x -> Refined (LessThan m) x #

n <= m => Weaken (LessThan n :: Type) (To m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (LessThan n) x -> Refined (To m) x #

m <= n => Weaken (SizeGreaterThan n :: Type) (SizeGreaterThan m :: Type) 
Instance details

Defined in Refined

n <= m => Weaken (SizeLessThan n :: Type) (SizeLessThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (SizeLessThan n) x -> Refined (SizeLessThan m) x #

n <= m => Weaken (To n :: Type) (To m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (To n) x -> Refined (To m) x #

p <= n => Weaken (FromTo n m :: Type) (From p :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (From p) x #

m <= q => Weaken (FromTo n m :: Type) (To q :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (To q) x #

(p <= n, m <= q) => Weaken (FromTo n m :: Type) (FromTo p q :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (FromTo p q) x #

type ZeroToOne = FromTo 0 1 #

data Even #

Constructors

Even 

Instances

Instances details
Data Even 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Even -> c Even #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Even #

toConstr :: Even -> Constr #

dataTypeOf :: Even -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Even) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Even) #

gmapT :: (forall b. Data b => b -> b) -> Even -> Even #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Even -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Even -> r #

gmapQ :: (forall d. Data d => d -> u) -> Even -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Even -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Even -> m Even #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Even -> m Even #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Even -> m Even #

Generic Even 
Instance details

Defined in Refined

Associated Types

type Rep Even 
Instance details

Defined in Refined

type Rep Even = D1 ('MetaData "Even" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Even" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Even -> Rep Even x #

to :: Rep Even x -> Even #

Integral x => Predicate Even x 
Instance details

Defined in Refined

type Rep Even 
Instance details

Defined in Refined

type Rep Even = D1 ('MetaData "Even" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Even" 'PrefixI 'False) (U1 :: Type -> Type))

data NaN #

Constructors

NaN 

Instances

Instances details
Data NaN 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NaN -> c NaN #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NaN #

toConstr :: NaN -> Constr #

dataTypeOf :: NaN -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NaN) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NaN) #

gmapT :: (forall b. Data b => b -> b) -> NaN -> NaN #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NaN -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NaN -> r #

gmapQ :: (forall d. Data d => d -> u) -> NaN -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NaN -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NaN -> m NaN #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NaN -> m NaN #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NaN -> m NaN #

Generic NaN 
Instance details

Defined in Refined

Associated Types

type Rep NaN 
Instance details

Defined in Refined

type Rep NaN = D1 ('MetaData "NaN" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NaN" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: NaN -> Rep NaN x #

to :: Rep NaN x -> NaN #

RealFloat x => Predicate NaN x 
Instance details

Defined in Refined

type Rep NaN 
Instance details

Defined in Refined

type Rep NaN = D1 ('MetaData "NaN" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NaN" 'PrefixI 'False) (U1 :: Type -> Type))

data Odd #

Constructors

Odd 

Instances

Instances details
Data Odd 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Odd -> c Odd #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Odd #

toConstr :: Odd -> Constr #

dataTypeOf :: Odd -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Odd) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Odd) #

gmapT :: (forall b. Data b => b -> b) -> Odd -> Odd #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Odd -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Odd -> r #

gmapQ :: (forall d. Data d => d -> u) -> Odd -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Odd -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

Generic Odd 
Instance details

Defined in Refined

Associated Types

type Rep Odd 
Instance details

Defined in Refined

type Rep Odd = D1 ('MetaData "Odd" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Odd" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Odd -> Rep Odd x #

to :: Rep Odd x -> Odd #

Integral x => Predicate Odd x 
Instance details

Defined in Refined

type Rep Odd 
Instance details

Defined in Refined

type Rep Odd = D1 ('MetaData "Odd" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Odd" 'PrefixI 'False) (U1 :: Type -> Type))

data DivisibleBy (n :: Nat) #

Constructors

DivisibleBy 

Instances

Instances details
(Integral x, KnownNat n) => Predicate (DivisibleBy n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Data (DivisibleBy n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DivisibleBy n -> c (DivisibleBy n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DivisibleBy n) #

toConstr :: DivisibleBy n -> Constr #

dataTypeOf :: DivisibleBy n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DivisibleBy n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DivisibleBy n)) #

gmapT :: (forall b. Data b => b -> b) -> DivisibleBy n -> DivisibleBy n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DivisibleBy n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DivisibleBy n -> r #

gmapQ :: (forall d. Data d => d -> u) -> DivisibleBy n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DivisibleBy n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DivisibleBy n -> m (DivisibleBy n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisibleBy n -> m (DivisibleBy n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DivisibleBy n -> m (DivisibleBy n) #

Generic (DivisibleBy n) 
Instance details

Defined in Refined

Associated Types

type Rep (DivisibleBy n) 
Instance details

Defined in Refined

type Rep (DivisibleBy n) = D1 ('MetaData "DivisibleBy" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "DivisibleBy" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: DivisibleBy n -> Rep (DivisibleBy n) x #

to :: Rep (DivisibleBy n) x -> DivisibleBy n #

type Rep (DivisibleBy n) 
Instance details

Defined in Refined

type Rep (DivisibleBy n) = D1 ('MetaData "DivisibleBy" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "DivisibleBy" 'PrefixI 'False) (U1 :: Type -> Type))

data NegativeFromTo (n :: Nat) (m :: Nat) #

Constructors

NegativeFromTo 

Instances

Instances details
(Ord x, Num x, KnownNat n, KnownNat m) => Predicate (NegativeFromTo n m :: Type) x 
Instance details

Defined in Refined

(KnownNat n, KnownNat m) => Data (NegativeFromTo n m) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NegativeFromTo n m -> c (NegativeFromTo n m) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NegativeFromTo n m) #

toConstr :: NegativeFromTo n m -> Constr #

dataTypeOf :: NegativeFromTo n m -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NegativeFromTo n m)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NegativeFromTo n m)) #

gmapT :: (forall b. Data b => b -> b) -> NegativeFromTo n m -> NegativeFromTo n m #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NegativeFromTo n m -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NegativeFromTo n m -> r #

gmapQ :: (forall d. Data d => d -> u) -> NegativeFromTo n m -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NegativeFromTo n m -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> NegativeFromTo n m -> m0 (NegativeFromTo n m) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> NegativeFromTo n m -> m0 (NegativeFromTo n m) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> NegativeFromTo n m -> m0 (NegativeFromTo n m) #

Generic (NegativeFromTo n m) 
Instance details

Defined in Refined

Associated Types

type Rep (NegativeFromTo n m) 
Instance details

Defined in Refined

type Rep (NegativeFromTo n m) = D1 ('MetaData "NegativeFromTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NegativeFromTo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: NegativeFromTo n m -> Rep (NegativeFromTo n m) x #

to :: Rep (NegativeFromTo n m) x -> NegativeFromTo n m #

type Rep (NegativeFromTo n m) 
Instance details

Defined in Refined

type Rep (NegativeFromTo n m) = D1 ('MetaData "NegativeFromTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NegativeFromTo" 'PrefixI 'False) (U1 :: Type -> Type))

data NotEqualTo (n :: Nat) #

Constructors

NotEqualTo 

Instances

Instances details
(Eq x, Num x, KnownNat n) => Predicate (NotEqualTo n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Data (NotEqualTo n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NotEqualTo n -> c (NotEqualTo n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NotEqualTo n) #

toConstr :: NotEqualTo n -> Constr #

dataTypeOf :: NotEqualTo n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NotEqualTo n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NotEqualTo n)) #

gmapT :: (forall b. Data b => b -> b) -> NotEqualTo n -> NotEqualTo n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NotEqualTo n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NotEqualTo n -> r #

gmapQ :: (forall d. Data d => d -> u) -> NotEqualTo n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NotEqualTo n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NotEqualTo n -> m (NotEqualTo n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NotEqualTo n -> m (NotEqualTo n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NotEqualTo n -> m (NotEqualTo n) #

Generic (NotEqualTo n) 
Instance details

Defined in Refined

Associated Types

type Rep (NotEqualTo n) 
Instance details

Defined in Refined

type Rep (NotEqualTo n) = D1 ('MetaData "NotEqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NotEqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: NotEqualTo n -> Rep (NotEqualTo n) x #

to :: Rep (NotEqualTo n) x -> NotEqualTo n #

type Rep (NotEqualTo n) 
Instance details

Defined in Refined

type Rep (NotEqualTo n) = D1 ('MetaData "NotEqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "NotEqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

data EqualTo (n :: Nat) #

Constructors

EqualTo 

Instances

Instances details
(Eq x, Num x, KnownNat n) => Predicate (EqualTo n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Data (EqualTo n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EqualTo n -> c (EqualTo n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EqualTo n) #

toConstr :: EqualTo n -> Constr #

dataTypeOf :: EqualTo n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EqualTo n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EqualTo n)) #

gmapT :: (forall b. Data b => b -> b) -> EqualTo n -> EqualTo n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EqualTo n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EqualTo n -> r #

gmapQ :: (forall d. Data d => d -> u) -> EqualTo n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EqualTo n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EqualTo n -> m (EqualTo n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EqualTo n -> m (EqualTo n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EqualTo n -> m (EqualTo n) #

Generic (EqualTo n) 
Instance details

Defined in Refined

Associated Types

type Rep (EqualTo n) 
Instance details

Defined in Refined

type Rep (EqualTo n) = D1 ('MetaData "EqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "EqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: EqualTo n -> Rep (EqualTo n) x #

to :: Rep (EqualTo n) x -> EqualTo n #

type Rep (EqualTo n) 
Instance details

Defined in Refined

type Rep (EqualTo n) = D1 ('MetaData "EqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "EqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

data To (n :: Nat) #

Constructors

To 

Instances

Instances details
n <= m => Weaken (LessThan n :: Type) (To m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (LessThan n) x -> Refined (To m) x #

n <= m => Weaken (To n :: Type) (To m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (To n) x -> Refined (To m) x #

m <= q => Weaken (FromTo n m :: Type) (To q :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (FromTo n m) x -> Refined (To q) x #

(Ord x, Num x, KnownNat n) => Predicate (To n :: Type) x 
Instance details

Defined in Refined

Methods

validate :: Proxy (To n) -> x -> Maybe RefineException #

KnownNat n => Data (To n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> To n -> c (To n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (To n) #

toConstr :: To n -> Constr #

dataTypeOf :: To n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (To n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (To n)) #

gmapT :: (forall b. Data b => b -> b) -> To n -> To n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> To n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> To n -> r #

gmapQ :: (forall d. Data d => d -> u) -> To n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> To n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> To n -> m (To n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> To n -> m (To n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> To n -> m (To n) #

Generic (To n) 
Instance details

Defined in Refined

Associated Types

type Rep (To n) 
Instance details

Defined in Refined

type Rep (To n) = D1 ('MetaData "To" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "To" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: To n -> Rep (To n) x #

to :: Rep (To n) x -> To n #

type Rep (To n) 
Instance details

Defined in Refined

type Rep (To n) = D1 ('MetaData "To" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "To" 'PrefixI 'False) (U1 :: Type -> Type))

data GreaterThan (n :: Nat) #

Constructors

GreaterThan 

Instances

Instances details
m <= n => Weaken (GreaterThan n :: Type) (From m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (GreaterThan n) x -> Refined (From m) x #

m <= n => Weaken (GreaterThan n :: Type) (GreaterThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (GreaterThan n) x -> Refined (GreaterThan m) x #

(Ord x, Num x, KnownNat n) => Predicate (GreaterThan n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Data (GreaterThan n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GreaterThan n -> c (GreaterThan n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GreaterThan n) #

toConstr :: GreaterThan n -> Constr #

dataTypeOf :: GreaterThan n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GreaterThan n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GreaterThan n)) #

gmapT :: (forall b. Data b => b -> b) -> GreaterThan n -> GreaterThan n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GreaterThan n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GreaterThan n -> r #

gmapQ :: (forall d. Data d => d -> u) -> GreaterThan n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GreaterThan n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GreaterThan n -> m (GreaterThan n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GreaterThan n -> m (GreaterThan n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GreaterThan n -> m (GreaterThan n) #

Generic (GreaterThan n) 
Instance details

Defined in Refined

Associated Types

type Rep (GreaterThan n) 
Instance details

Defined in Refined

type Rep (GreaterThan n) = D1 ('MetaData "GreaterThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "GreaterThan" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: GreaterThan n -> Rep (GreaterThan n) x #

to :: Rep (GreaterThan n) x -> GreaterThan n #

type Rep (GreaterThan n) 
Instance details

Defined in Refined

type Rep (GreaterThan n) = D1 ('MetaData "GreaterThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "GreaterThan" 'PrefixI 'False) (U1 :: Type -> Type))

data LessThan (n :: Nat) #

Constructors

LessThan 

Instances

Instances details
n <= m => Weaken (LessThan n :: Type) (LessThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (LessThan n) x -> Refined (LessThan m) x #

n <= m => Weaken (LessThan n :: Type) (To m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (LessThan n) x -> Refined (To m) x #

(Ord x, Num x, KnownNat n) => Predicate (LessThan n :: Type) x 
Instance details

Defined in Refined

KnownNat n => Data (LessThan n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LessThan n -> c (LessThan n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LessThan n) #

toConstr :: LessThan n -> Constr #

dataTypeOf :: LessThan n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (LessThan n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LessThan n)) #

gmapT :: (forall b. Data b => b -> b) -> LessThan n -> LessThan n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LessThan n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LessThan n -> r #

gmapQ :: (forall d. Data d => d -> u) -> LessThan n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LessThan n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LessThan n -> m (LessThan n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LessThan n -> m (LessThan n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LessThan n -> m (LessThan n) #

Generic (LessThan n) 
Instance details

Defined in Refined

Associated Types

type Rep (LessThan n) 
Instance details

Defined in Refined

type Rep (LessThan n) = D1 ('MetaData "LessThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "LessThan" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: LessThan n -> Rep (LessThan n) x #

to :: Rep (LessThan n) x -> LessThan n #

type Rep (LessThan n) 
Instance details

Defined in Refined

type Rep (LessThan n) = D1 ('MetaData "LessThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "LessThan" 'PrefixI 'False) (U1 :: Type -> Type))

data Descending #

Constructors

Descending 

Instances

Instances details
Data Descending 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Descending -> c Descending #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Descending #

toConstr :: Descending -> Constr #

dataTypeOf :: Descending -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Descending) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Descending) #

gmapT :: (forall b. Data b => b -> b) -> Descending -> Descending #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Descending -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Descending -> r #

gmapQ :: (forall d. Data d => d -> u) -> Descending -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Descending -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Descending -> m Descending #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Descending -> m Descending #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Descending -> m Descending #

Generic Descending 
Instance details

Defined in Refined

Associated Types

type Rep Descending 
Instance details

Defined in Refined

type Rep Descending = D1 ('MetaData "Descending" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Descending" 'PrefixI 'False) (U1 :: Type -> Type))
(Foldable t, Ord a) => Predicate Descending (t a) 
Instance details

Defined in Refined

type Rep Descending 
Instance details

Defined in Refined

type Rep Descending = D1 ('MetaData "Descending" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Descending" 'PrefixI 'False) (U1 :: Type -> Type))

data Ascending #

Constructors

Ascending 

Instances

Instances details
Data Ascending 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ascending -> c Ascending #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ascending #

toConstr :: Ascending -> Constr #

dataTypeOf :: Ascending -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ascending) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ascending) #

gmapT :: (forall b. Data b => b -> b) -> Ascending -> Ascending #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ascending -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ascending -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ascending -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ascending -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ascending -> m Ascending #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ascending -> m Ascending #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ascending -> m Ascending #

Generic Ascending 
Instance details

Defined in Refined

Associated Types

type Rep Ascending 
Instance details

Defined in Refined

type Rep Ascending = D1 ('MetaData "Ascending" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Ascending" 'PrefixI 'False) (U1 :: Type -> Type))
(Foldable t, Ord a) => Predicate Ascending (t a) 
Instance details

Defined in Refined

type Rep Ascending 
Instance details

Defined in Refined

type Rep Ascending = D1 ('MetaData "Ascending" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "Ascending" 'PrefixI 'False) (U1 :: Type -> Type))

data SizeEqualTo (n :: Nat) #

Constructors

SizeEqualTo 

Instances

Instances details
(Foldable t, KnownNat n) => Predicate1 (SizeEqualTo n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeEqualTo n :: Type) Text 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate (SizeEqualTo n :: Type) (t a) 
Instance details

Defined in Refined

KnownNat n => Data (SizeEqualTo n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SizeEqualTo n -> c (SizeEqualTo n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SizeEqualTo n) #

toConstr :: SizeEqualTo n -> Constr #

dataTypeOf :: SizeEqualTo n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SizeEqualTo n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SizeEqualTo n)) #

gmapT :: (forall b. Data b => b -> b) -> SizeEqualTo n -> SizeEqualTo n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SizeEqualTo n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SizeEqualTo n -> r #

gmapQ :: (forall d. Data d => d -> u) -> SizeEqualTo n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SizeEqualTo n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SizeEqualTo n -> m (SizeEqualTo n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeEqualTo n -> m (SizeEqualTo n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeEqualTo n -> m (SizeEqualTo n) #

Generic (SizeEqualTo n) 
Instance details

Defined in Refined

Associated Types

type Rep (SizeEqualTo n) 
Instance details

Defined in Refined

type Rep (SizeEqualTo n) = D1 ('MetaData "SizeEqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeEqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: SizeEqualTo n -> Rep (SizeEqualTo n) x #

to :: Rep (SizeEqualTo n) x -> SizeEqualTo n #

(Arbitrary a, Typeable a, Predicate (SizeEqualTo n) [a], KnownNat n) => Arbitrary (Refined (SizeEqualTo n) [a]) Source # 
Instance details

Defined in System.Process.Quick.Predicate.LowerCase

Methods

arbitrary :: Gen (Refined (SizeEqualTo n) [a]) #

shrink :: Refined (SizeEqualTo n) [a] -> [Refined (SizeEqualTo n) [a]] #

type Rep (SizeEqualTo n) 
Instance details

Defined in Refined

type Rep (SizeEqualTo n) = D1 ('MetaData "SizeEqualTo" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeEqualTo" 'PrefixI 'False) (U1 :: Type -> Type))

data SizeGreaterThan (n :: Nat) #

Constructors

SizeGreaterThan 

Instances

Instances details
(Foldable t, KnownNat n) => Predicate1 (SizeGreaterThan n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

m <= n => Weaken (SizeGreaterThan n :: Type) (SizeGreaterThan m :: Type) 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeGreaterThan n :: Type) Text 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate (SizeGreaterThan n :: Type) (t a) 
Instance details

Defined in Refined

KnownNat n => Data (SizeGreaterThan n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SizeGreaterThan n -> c (SizeGreaterThan n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SizeGreaterThan n) #

toConstr :: SizeGreaterThan n -> Constr #

dataTypeOf :: SizeGreaterThan n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SizeGreaterThan n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SizeGreaterThan n)) #

gmapT :: (forall b. Data b => b -> b) -> SizeGreaterThan n -> SizeGreaterThan n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SizeGreaterThan n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SizeGreaterThan n -> r #

gmapQ :: (forall d. Data d => d -> u) -> SizeGreaterThan n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SizeGreaterThan n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SizeGreaterThan n -> m (SizeGreaterThan n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeGreaterThan n -> m (SizeGreaterThan n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeGreaterThan n -> m (SizeGreaterThan n) #

Generic (SizeGreaterThan n) 
Instance details

Defined in Refined

Associated Types

type Rep (SizeGreaterThan n) 
Instance details

Defined in Refined

type Rep (SizeGreaterThan n) = D1 ('MetaData "SizeGreaterThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeGreaterThan" 'PrefixI 'False) (U1 :: Type -> Type))
type Rep (SizeGreaterThan n) 
Instance details

Defined in Refined

type Rep (SizeGreaterThan n) = D1 ('MetaData "SizeGreaterThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeGreaterThan" 'PrefixI 'False) (U1 :: Type -> Type))

data SizeLessThan (n :: Nat) #

Constructors

SizeLessThan 

Instances

Instances details
(Foldable t, KnownNat n) => Predicate1 (SizeLessThan n :: Type) (t :: Type -> Type) 
Instance details

Defined in Refined

n <= m => Weaken (SizeLessThan n :: Type) (SizeLessThan m :: Type) 
Instance details

Defined in Refined

Methods

weaken :: Refined (SizeLessThan n) x -> Refined (SizeLessThan m) x #

KnownNat n => Predicate (SizeLessThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeLessThan n :: Type) ByteString 
Instance details

Defined in Refined

KnownNat n => Predicate (SizeLessThan n :: Type) Text 
Instance details

Defined in Refined

(Foldable t, KnownNat n) => Predicate (SizeLessThan n :: Type) (t a) 
Instance details

Defined in Refined

KnownNat n => Data (SizeLessThan n) 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SizeLessThan n -> c (SizeLessThan n) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SizeLessThan n) #

toConstr :: SizeLessThan n -> Constr #

dataTypeOf :: SizeLessThan n -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SizeLessThan n)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SizeLessThan n)) #

gmapT :: (forall b. Data b => b -> b) -> SizeLessThan n -> SizeLessThan n #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SizeLessThan n -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SizeLessThan n -> r #

gmapQ :: (forall d. Data d => d -> u) -> SizeLessThan n -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SizeLessThan n -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SizeLessThan n -> m (SizeLessThan n) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeLessThan n -> m (SizeLessThan n) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SizeLessThan n -> m (SizeLessThan n) #

Generic (SizeLessThan n) 
Instance details

Defined in Refined

Associated Types

type Rep (SizeLessThan n) 
Instance details

Defined in Refined

type Rep (SizeLessThan n) = D1 ('MetaData "SizeLessThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeLessThan" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: SizeLessThan n -> Rep (SizeLessThan n) x #

to :: Rep (SizeLessThan n) x -> SizeLessThan n #

type Rep (SizeLessThan n) 
Instance details

Defined in Refined

type Rep (SizeLessThan n) = D1 ('MetaData "SizeLessThan" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "SizeLessThan" 'PrefixI 'False) (U1 :: Type -> Type))

data IdPred #

Constructors

IdPred 

Instances

Instances details
Data IdPred 
Instance details

Defined in Refined

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdPred -> c IdPred #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdPred #

toConstr :: IdPred -> Constr #

dataTypeOf :: IdPred -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdPred) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdPred) #

gmapT :: (forall b. Data b => b -> b) -> IdPred -> IdPred #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdPred -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdPred -> r #

gmapQ :: (forall d. Data d => d -> u) -> IdPred -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdPred -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdPred -> m IdPred #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdPred -> m IdPred #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdPred -> m IdPred #

Generic IdPred 
Instance details

Defined in Refined

Associated Types

type Rep IdPred 
Instance details

Defined in Refined

type Rep IdPred = D1 ('MetaData "IdPred" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "IdPred" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: IdPred -> Rep IdPred x #

to :: Rep IdPred x -> IdPred #

Predicate IdPred x 
Instance details

Defined in Refined

type Rep IdPred 
Instance details

Defined in Refined

type Rep IdPred = D1 ('MetaData "IdPred" "Refined" "quick-process-0.0.1-inplace-refined-internal" 'False) (C1 ('MetaCons "IdPred" 'PrefixI 'False) (U1 :: Type -> Type))

refine :: forall {k} (p :: k) x. Predicate p x => x -> Either RefineException (Refined p x) #

refine_ :: forall {k} (p :: k) x. Predicate p x => x -> Either RefineException x #

refineThrow :: forall {k} (p :: k) x m. (Predicate p x, MonadThrow m) => x -> m (Refined p x) #

refineFail :: forall {k} (p :: k) x m. (Predicate p x, MonadFail m) => x -> m (Refined p x) #

refineError :: forall {k} (p :: k) x m. (Predicate p x, MonadError RefineException m) => x -> m (Refined p x) #

refineEither :: forall {k} (p :: k) x. Predicate p x => x -> Either (Refined (Not p) x) (Refined p x) #

refineTH :: forall {k} (p :: k) x (m :: Type -> Type). (Predicate p x, Lift x, Quote m, MonadFail m) => x -> Code m (Refined p x) #

refineTH_ :: forall {k} (p :: k) x (m :: Type -> Type). (Predicate p x, Lift x, Quote m, MonadFail m) => x -> Code m x #

unrefine :: forall {k} (p :: k) x. Refined p x -> x #

reifyPredicate :: forall {k} (p :: k) a. Predicate p a => a -> Bool #

andLeft :: forall {k1} {k2} (l :: k1) (r :: k2) x. Refined (And l r) x -> Refined l x #

andRight :: forall {k1} {k2} (l :: k1) (r :: k2) x. Refined (And l r) x -> Refined r x #

leftOr :: forall {k1} {k2} (l :: k1) x (r :: k2). Refined l x -> Refined (Or l r) x #

rightOr :: forall {k1} {k2} (r :: k1) x (l :: k2). Refined r x -> Refined (Or l r) x #

weakenAndLeft :: forall {k1} {k2} {k3} (from :: k1) (to :: k2) (x :: k3) a. Weaken from to => Refined (And from x) a -> Refined (And to x) a #

weakenAndRight :: forall {k1} {k2} {k3} (from :: k1) (to :: k2) (x :: k3) a. Weaken from to => Refined (And x from) a -> Refined (And x to) a #

weakenOrLeft :: forall {k1} {k2} {k3} (from :: k1) (to :: k2) (x :: k3) a. Weaken from to => Refined (Or from x) a -> Refined (Or to x) a #

weakenOrRight :: forall {k1} {k2} {k3} (from :: k1) (to :: k2) (x :: k3) a. Weaken from to => Refined (Or x from) a -> Refined (Or x to) a #

strengthen :: forall {k1} {k2} (p :: k1) (p' :: k2) x. (Predicate p x, Predicate p' x) => Refined p x -> Either RefineException (Refined (p && p') x) #

data InDir Source #

Instances

Instances details
Data InDir Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InDir -> c InDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InDir #

toConstr :: InDir -> Constr #

dataTypeOf :: InDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InDir) #

gmapT :: (forall b. Data b => b -> b) -> InDir -> InDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> InDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InDir -> m InDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InDir -> m InDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InDir -> m InDir #

Generic InDir Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Associated Types

type Rep InDir 
Instance details

Defined in System.Process.Quick.Predicate.InDir

type Rep InDir = D1 ('MetaData "InDir" "System.Process.Quick.Predicate.InDir" "quick-process-0.0.1-inplace" 'False) (V1 :: Type -> Type)

Methods

from :: InDir -> Rep InDir x #

to :: Rep InDir x -> InDir #

Show InDir Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Methods

showsPrec :: Int -> InDir -> ShowS #

show :: InDir -> String #

showList :: [InDir] -> ShowS #

Eq InDir Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Methods

(==) :: InDir -> InDir -> Bool #

(/=) :: InDir -> InDir -> Bool #

Predicate InDir FilePath Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

RefinedInArgLocator (Refined InDir FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

Arbitrary (Refined InDir FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

type Rep InDir Source # 
Instance details

Defined in System.Process.Quick.Predicate.InDir

type Rep InDir = D1 ('MetaData "InDir" "System.Process.Quick.Predicate.InDir" "quick-process-0.0.1-inplace" 'False) (V1 :: Type -> Type)

data InFile (ext :: Symbol) Source #

Instances

Instances details
KnownSymbol e => Predicate (InFile e :: Type) String Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Predicate (InFile e) String => Predicate (InFile e :: Type) (NeList String) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Predicate (InFile e) String => Predicate (InFile e :: Type) [String] Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedInArgLocator (Refined (InFile e) FilePath :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedInArgLocator (Refined (InFile e) (NeList FilePath) :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

RefinedInArgLocator (Refined (InFile e) [FilePath] :: Type) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol ext => Data (InFile ext) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InFile ext -> c (InFile ext) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InFile ext) #

toConstr :: InFile ext -> Constr #

dataTypeOf :: InFile ext -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (InFile ext)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InFile ext)) #

gmapT :: (forall b. Data b => b -> b) -> InFile ext -> InFile ext #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InFile ext -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InFile ext -> r #

gmapQ :: (forall d. Data d => d -> u) -> InFile ext -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InFile ext -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InFile ext -> m (InFile ext) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InFile ext -> m (InFile ext) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InFile ext -> m (InFile ext) #

Generic (InFile ext) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Associated Types

type Rep (InFile ext) 
Instance details

Defined in System.Process.Quick.Predicate.InFile

type Rep (InFile ext) = D1 ('MetaData "InFile" "System.Process.Quick.Predicate.InFile" "quick-process-0.0.1-inplace" 'False) (V1 :: Type -> Type)

Methods

from :: InFile ext -> Rep (InFile ext) x #

to :: Rep (InFile ext) x -> InFile ext #

Show (InFile ext) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Methods

showsPrec :: Int -> InFile ext -> ShowS #

show :: InFile ext -> String #

showList :: [InFile ext] -> ShowS #

Eq (InFile ext) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

Methods

(==) :: InFile ext -> InFile ext -> Bool #

(/=) :: InFile ext -> InFile ext -> Bool #

KnownSymbol e => Arbitrary (Refined (InFile e) FilePath) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Arbitrary (Refined (InFile e) (NeList FilePath)) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

KnownSymbol e => Arbitrary (Refined (InFile e) [FilePath]) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

type Rep (InFile ext) Source # 
Instance details

Defined in System.Process.Quick.Predicate.InFile

type Rep (InFile ext) = D1 ('MetaData "InFile" "System.Process.Quick.Predicate.InFile" "quick-process-0.0.1-inplace" 'False) (V1 :: Type -> Type)

data Refined1 (p :: k1) (f :: k -> Type) (x :: k) #

Instances

Instances details
Lift (f a) => Lift (Refined1 p f a :: Type) 
Instance details

Defined in Refined.Unsafe.Type

Methods

lift :: Quote m => Refined1 p f a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Refined1 p f a -> Code m (Refined1 p f a) #

Functor f => Functor (Refined1 p f) 
Instance details

Defined in Refined.Unsafe.Type

Methods

fmap :: (a -> b) -> Refined1 p f a -> Refined1 p f b #

(<$) :: a -> Refined1 p f b -> Refined1 p f a #

Foldable f => Foldable (Refined1 p f) 
Instance details

Defined in Refined.Unsafe.Type

Methods

fold :: Monoid m => Refined1 p f m -> m #

foldMap :: Monoid m => (a -> m) -> Refined1 p f a -> m #

foldMap' :: Monoid m => (a -> m) -> Refined1 p f a -> m #

foldr :: (a -> b -> b) -> b -> Refined1 p f a -> b #

foldr' :: (a -> b -> b) -> b -> Refined1 p f a -> b #

foldl :: (b -> a -> b) -> b -> Refined1 p f a -> b #

foldl' :: (b -> a -> b) -> b -> Refined1 p f a -> b #

foldr1 :: (a -> a -> a) -> Refined1 p f a -> a #

foldl1 :: (a -> a -> a) -> Refined1 p f a -> a #

toList :: Refined1 p f a -> [a] #

null :: Refined1 p f a -> Bool #

length :: Refined1 p f a -> Int #

elem :: Eq a => a -> Refined1 p f a -> Bool #

maximum :: Ord a => Refined1 p f a -> a #

minimum :: Ord a => Refined1 p f a -> a #

sum :: Num a => Refined1 p f a -> a #

product :: Num a => Refined1 p f a -> a #

Traversable f => Traversable (Refined1 p f) 
Instance details

Defined in Refined.Unsafe.Type

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Refined1 p f a -> f0 (Refined1 p f b) #

sequenceA :: Applicative f0 => Refined1 p f (f0 a) -> f0 (Refined1 p f a) #

mapM :: Monad m => (a -> m b) -> Refined1 p f a -> m (Refined1 p f b) #

sequence :: Monad m => Refined1 p f (m a) -> m (Refined1 p f a) #

NFData (f x) => NFData (Refined1 p f x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

rnf :: Refined1 p f x -> () #

Show (f x) => Show (Refined1 p f x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

showsPrec :: Int -> Refined1 p f x -> ShowS #

show :: Refined1 p f x -> String #

showList :: [Refined1 p f x] -> ShowS #

Eq (f x) => Eq (Refined1 p f x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

(==) :: Refined1 p f x -> Refined1 p f x -> Bool #

(/=) :: Refined1 p f x -> Refined1 p f x -> Bool #

Ord (f x) => Ord (Refined1 p f x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

compare :: Refined1 p f x -> Refined1 p f x -> Ordering #

(<) :: Refined1 p f x -> Refined1 p f x -> Bool #

(<=) :: Refined1 p f x -> Refined1 p f x -> Bool #

(>) :: Refined1 p f x -> Refined1 p f x -> Bool #

(>=) :: Refined1 p f x -> Refined1 p f x -> Bool #

max :: Refined1 p f x -> Refined1 p f x -> Refined1 p f x #

min :: Refined1 p f x -> Refined1 p f x -> Refined1 p f x #

Hashable (f x) => Hashable (Refined1 p f x) 
Instance details

Defined in Refined.Unsafe.Type

Methods

hashWithSalt :: Int -> Refined1 p f x -> Int #

hash :: Refined1 p f x -> Int #

refine1 :: forall {k1} {k} (p :: k1) f (x :: k). Predicate1 p f => f x -> Either RefineException (Refined1 p f x) #

unrefine1 :: forall {k1} {k} (p :: k1) f (x :: k). Refined1 p f x -> f x #

validate' :: forall {k} (p :: k) x. Predicate p x => Proxy p -> x -> Maybe RefineException #

validate1' :: forall {k1} {k2} (p :: k2) f (a :: k1). Predicate1 p f => Proxy p -> f a -> Maybe RefineException #