{-# LANGUAGE CPP, TypeFamilies, DeriveDataTypeable #-} module PGIP.GraphQL.Result.Action where import Data.Data data Action = Action { Action -> String evaluationState :: String , Action -> Maybe String message :: Maybe String } deriving (Int -> Action -> ShowS [Action] -> ShowS Action -> String (Int -> Action -> ShowS) -> (Action -> String) -> ([Action] -> ShowS) -> Show Action forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Action] -> ShowS $cshowList :: [Action] -> ShowS show :: Action -> String $cshow :: Action -> String showsPrec :: Int -> Action -> ShowS $cshowsPrec :: Int -> Action -> ShowS Show, Typeable, Typeable Action Constr DataType Typeable Action => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action) -> (Action -> Constr) -> (Action -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Action)) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Action)) -> ((forall b. Data b => b -> b) -> Action -> Action) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r) -> (forall u. (forall d. Data d => d -> u) -> Action -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> Action -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> Action -> m Action) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action) -> Data Action Action -> Constr Action -> DataType (forall b. Data b => b -> b) -> Action -> Action (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action forall a. Typeable a => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> a -> c a) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c a) -> (a -> Constr) -> (a -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c a)) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a)) -> ((forall b. Data b => b -> b) -> a -> a) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall u. (forall d. Data d => d -> u) -> a -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> Data a forall u. Int -> (forall d. Data d => d -> u) -> Action -> u forall u. (forall d. Data d => d -> u) -> Action -> [u] forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> Action -> m Action forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Action) forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Action) $cAction :: Constr $tAction :: DataType gmapMo :: (forall d. Data d => d -> m d) -> Action -> m Action $cgmapMo :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action gmapMp :: (forall d. Data d => d -> m d) -> Action -> m Action $cgmapMp :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action gmapM :: (forall d. Data d => d -> m d) -> Action -> m Action $cgmapM :: forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> Action -> m Action gmapQi :: Int -> (forall d. Data d => d -> u) -> Action -> u $cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> Action -> u gmapQ :: (forall d. Data d => d -> u) -> Action -> [u] $cgmapQ :: forall u. (forall d. Data d => d -> u) -> Action -> [u] gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r $cgmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r $cgmapQl :: forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r gmapT :: (forall b. Data b => b -> b) -> Action -> Action $cgmapT :: (forall b. Data b => b -> b) -> Action -> Action dataCast2 :: (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Action) $cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Action) dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c Action) $cdataCast1 :: forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Action) dataTypeOf :: Action -> DataType $cdataTypeOf :: Action -> DataType toConstr :: Action -> Constr $ctoConstr :: Action -> Constr gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action $cgunfold :: forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action $cgfoldl :: forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action $cp1Data :: Typeable Action Data)