{-# options_haddock prune #-}

-- |Description: SystemProcessError, Internal
module Polysemy.Process.Data.SystemProcessError where

-- |Error for 'Polysemy.Process.SystemProcess'.
data SystemProcessError =
  -- |The process terminated.
  Terminated Text
  |
  -- |Stdio was requested, but the process was started without pipes.
  NoPipes
  deriving stock (SystemProcessError -> SystemProcessError -> Bool
(SystemProcessError -> SystemProcessError -> Bool)
-> (SystemProcessError -> SystemProcessError -> Bool)
-> Eq SystemProcessError
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SystemProcessError -> SystemProcessError -> Bool
== :: SystemProcessError -> SystemProcessError -> Bool
$c/= :: SystemProcessError -> SystemProcessError -> Bool
/= :: SystemProcessError -> SystemProcessError -> Bool
Eq, Int -> SystemProcessError -> ShowS
[SystemProcessError] -> ShowS
SystemProcessError -> String
(Int -> SystemProcessError -> ShowS)
-> (SystemProcessError -> String)
-> ([SystemProcessError] -> ShowS)
-> Show SystemProcessError
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SystemProcessError -> ShowS
showsPrec :: Int -> SystemProcessError -> ShowS
$cshow :: SystemProcessError -> String
show :: SystemProcessError -> String
$cshowList :: [SystemProcessError] -> ShowS
showList :: [SystemProcessError] -> ShowS
Show)

-- |Error for the scope of 'Polysemy.Process.SystemProcess'.
data SystemProcessScopeError =
  -- |The process couldn't start.
  StartFailed Text
  deriving stock (SystemProcessScopeError -> SystemProcessScopeError -> Bool
(SystemProcessScopeError -> SystemProcessScopeError -> Bool)
-> (SystemProcessScopeError -> SystemProcessScopeError -> Bool)
-> Eq SystemProcessScopeError
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SystemProcessScopeError -> SystemProcessScopeError -> Bool
== :: SystemProcessScopeError -> SystemProcessScopeError -> Bool
$c/= :: SystemProcessScopeError -> SystemProcessScopeError -> Bool
/= :: SystemProcessScopeError -> SystemProcessScopeError -> Bool
Eq, Int -> SystemProcessScopeError -> ShowS
[SystemProcessScopeError] -> ShowS
SystemProcessScopeError -> String
(Int -> SystemProcessScopeError -> ShowS)
-> (SystemProcessScopeError -> String)
-> ([SystemProcessScopeError] -> ShowS)
-> Show SystemProcessScopeError
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SystemProcessScopeError -> ShowS
showsPrec :: Int -> SystemProcessScopeError -> ShowS
$cshow :: SystemProcessScopeError -> String
show :: SystemProcessScopeError -> String
$cshowList :: [SystemProcessScopeError] -> ShowS
showList :: [SystemProcessScopeError] -> ShowS
Show)