| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Affection.MessageBus.Class
Documentation
class (Message (Mesg prt us), Show (Mesg prt us)) => Participant prt us where Source #
This typeclass defines the behaviour of a participant in the message system
Minimal complete definition
Methods
Arguments
| :: prt | the |
| -> Affection us [Mesg prt us -> Affection us ()] | List of Subscriber functions |
Function to get the list of subscribers from the participant
Arguments
| :: prt | The |
| -> (Mesg prt us -> Affection us ()) | What to do in case of a |
| -> Affection us UUID |
|
Subscribe to the Participant's events
Arguments
| :: prt | The |
| -> UUID | The subscriber function's |
| -> Affection us () |
Unsubscribe a Subscriber function from Participant
Arguments
| :: prt | The |
| -> Mesg prt us | The |
| -> Affection us () |
Get the Participant to emit a Message on all of its subscribers
The UUID type. A Random instance is provided which produces
version 4 UUIDs as specified in RFC 4122. The Storable and
Binary instances are compatible with RFC 4122, storing the fields
in network order as 16 bytes.
Instances
| Eq UUID | |
| Data UUID | |
Defined in Data.UUID.Types.Internal Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UUID -> c UUID # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UUID # dataTypeOf :: UUID -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UUID) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UUID) # gmapT :: (forall b. Data b => b -> b) -> UUID -> UUID # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r # gmapQ :: (forall d. Data d => d -> u) -> UUID -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UUID -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UUID -> m UUID # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID # | |
| Ord UUID | |
| Read UUID | |
| Show UUID | |
| Storable UUID | |
Defined in Data.UUID.Types.Internal | |
| Binary UUID | |
| NFData UUID | |
Defined in Data.UUID.Types.Internal | |
| Hashable UUID | |
Defined in Data.UUID.Types.Internal | |
| Random UUID | |