Calamity.Types.Model.User
Description
A User
data User Source #
Constructors
Fields
Defined in Calamity.Types.Model.User
Methods
(==) :: User -> User -> Bool #
(/=) :: User -> User -> Bool #
showsPrec :: Int -> User -> ShowS #
show :: User -> String #
showList :: [User] -> ShowS #
Associated Types
type Rep User :: Type -> Type #
from :: User -> Rep User x #
to :: Rep User x -> User #
showbPrec :: Int -> User -> Builder
showb :: User -> Builder
showbList :: [User] -> Builder
showtPrec :: Int -> User -> Text
showt :: User -> Text
showtList :: [User] -> Text
showtlPrec :: Int -> User -> Text
showtl :: User -> Text
showtlList :: [User] -> Text
parseJSON :: Value -> Parser User
parseJSONList :: Value -> Parser [User]
toJSON :: User -> Value
toEncoding :: User -> Encoding
toJSONList :: [User] -> Value
toEncodingList :: [User] -> Encoding
Defined in Calamity.Internal.Updateable
type Updated User Source #
update :: Updated User -> User -> User Source #
Defined in Calamity.Types.Tellable
getChannel :: forall (r :: [(Type -> Type) -> Type -> Type]). (BotC r, Member (Error RestError) r) => User -> Sem r (Snowflake Channel) Source #
getID :: User -> Snowflake Member Source #
Defined in Calamity.Types.Model.Channel.Message
getID :: Message -> Snowflake User Source #
Defined in Calamity.Types.Model.Guild.Member
getID :: Member -> Snowflake User Source #
getID :: User -> Snowflake User Source #
Defined in Calamity.Types.Model.Channel.Reaction
getID :: Reaction -> Snowflake User Source #
Defined in Calamity.Types.Model.Channel.Group
getID :: GroupChannel -> Snowflake User Source #
Defined in Calamity.Types.Model.Guild.AuditLog
getID :: AuditLogEntry -> Snowflake User Source #
Defined in Calamity.Types.Model.Presence.Presence
getID :: Presence -> Snowflake User Source #
Defined in Calamity.Types.Model.Guild.Ban
getID :: BanData -> Snowflake User Source #
Parser for users, this only looks in the cache. Use Snowflake User and use upgrade if you want to allow fetching from http.
Snowflake User
Snowflake
User
upgrade
Defined in Calamity.Commands.Parser
type ParserResult User Source #
parserName :: Text Source #
parse :: Sem (ParserEffs r) (ParserResult User) Source #
getID :: Partial User -> Snowflake User Source #
Defined in Calamity.Types.Upgradeable
upgrade :: forall (r :: [(Type -> Type) -> Type -> Type]). BotC r => Snowflake User -> Sem r (Maybe User) Source #
(==) :: Partial User -> Partial User -> Bool #
(/=) :: Partial User -> Partial User -> Bool #
showsPrec :: Int -> Partial User -> ShowS #
show :: Partial User -> String #
showList :: [Partial User] -> ShowS #
type Rep (Partial User) :: Type -> Type #
from :: Partial User -> Rep (Partial User) x #
to :: Rep (Partial User) x -> Partial User #
showbPrec :: Int -> Partial User -> Builder
showb :: Partial User -> Builder
showbList :: [Partial User] -> Builder
showtPrec :: Int -> Partial User -> Text
showt :: Partial User -> Text
showtList :: [Partial User] -> Text
showtlPrec :: Int -> Partial User -> Text
showtl :: Partial User -> Text
showtlList :: [Partial User] -> Text
parseJSON :: Value -> Parser (Partial User)
parseJSONList :: Value -> Parser [Partial User]
toJSON :: Partial User -> Value
toEncoding :: Partial User -> Encoding
toJSONList :: [Partial User] -> Value
toEncodingList :: [Partial User] -> Encoding
getChannel :: forall (r :: [(Type -> Type) -> Type -> Type]). (BotC r, Member (Error RestError) r) => Snowflake User -> Sem r (Snowflake Channel) Source #
type ParserResult (Snowflake User) Source #
parse :: Sem (ParserEffs r) (ParserResult (Snowflake User)) Source #
data family Partial t Source #
Defined in Calamity.Types.Model.Channel
getID :: Partial Channel -> Snowflake Channel Source #
Defined in Calamity.Types.Model.Guild.Guild
getID :: Partial Guild -> Snowflake Guild Source #
Defined in Calamity.Types.Model.Guild.Emoji
getID :: Partial Emoji -> Snowflake Emoji Source #
(==) :: Partial Channel -> Partial Channel -> Bool #
(/=) :: Partial Channel -> Partial Channel -> Bool #
(==) :: Partial Guild -> Partial Guild -> Bool #
(/=) :: Partial Guild -> Partial Guild -> Bool #
(==) :: Partial Emoji -> Partial Emoji -> Bool #
(/=) :: Partial Emoji -> Partial Emoji -> Bool #
showsPrec :: Int -> Partial Channel -> ShowS #
show :: Partial Channel -> String #
showList :: [Partial Channel] -> ShowS #
showsPrec :: Int -> Partial Guild -> ShowS #
show :: Partial Guild -> String #
showList :: [Partial Guild] -> ShowS #
showsPrec :: Int -> Partial Emoji -> ShowS #
show :: Partial Emoji -> String #
showList :: [Partial Emoji] -> ShowS #
type Rep (Partial Channel) :: Type -> Type #
from :: Partial Channel -> Rep (Partial Channel) x #
to :: Rep (Partial Channel) x -> Partial Channel #
type Rep (Partial Guild) :: Type -> Type #
from :: Partial Guild -> Rep (Partial Guild) x #
to :: Rep (Partial Guild) x -> Partial Guild #
type Rep (Partial Emoji) :: Type -> Type #
from :: Partial Emoji -> Rep (Partial Emoji) x #
to :: Rep (Partial Emoji) x -> Partial Emoji #
showbPrec :: Int -> Partial Channel -> Builder
showb :: Partial Channel -> Builder
showbList :: [Partial Channel] -> Builder
showtPrec :: Int -> Partial Channel -> Text
showt :: Partial Channel -> Text
showtList :: [Partial Channel] -> Text
showtlPrec :: Int -> Partial Channel -> Text
showtl :: Partial Channel -> Text
showtlList :: [Partial Channel] -> Text
showbPrec :: Int -> Partial Guild -> Builder
showb :: Partial Guild -> Builder
showbList :: [Partial Guild] -> Builder
showtPrec :: Int -> Partial Guild -> Text
showt :: Partial Guild -> Text
showtList :: [Partial Guild] -> Text
showtlPrec :: Int -> Partial Guild -> Text
showtl :: Partial Guild -> Text
showtlList :: [Partial Guild] -> Text
showbPrec :: Int -> Partial Emoji -> Builder
showb :: Partial Emoji -> Builder
showbList :: [Partial Emoji] -> Builder
showtPrec :: Int -> Partial Emoji -> Text
showt :: Partial Emoji -> Text
showtList :: [Partial Emoji] -> Text
showtlPrec :: Int -> Partial Emoji -> Text
showtl :: Partial Emoji -> Text
showtlList :: [Partial Emoji] -> Text
parseJSON :: Value -> Parser (Partial Channel)
parseJSONList :: Value -> Parser [Partial Channel]
parseJSON :: Value -> Parser (Partial Guild)
parseJSONList :: Value -> Parser [Partial Guild]
parseJSON :: Value -> Parser (Partial Emoji)
parseJSONList :: Value -> Parser [Partial Emoji]
toJSON :: Partial Channel -> Value
toEncoding :: Partial Channel -> Encoding
toJSONList :: [Partial Channel] -> Value
toEncodingList :: [Partial Channel] -> Encoding
toJSON :: Partial Guild -> Value
toEncoding :: Partial Guild -> Encoding
toJSONList :: [Partial Guild] -> Value
toEncodingList :: [Partial Guild] -> Encoding
toJSON :: Partial Emoji -> Value
toEncoding :: Partial Emoji -> Encoding
toJSONList :: [Partial Emoji] -> Value
toEncodingList :: [Partial Emoji] -> Encoding
data StatusType Source #
succ :: StatusType -> StatusType #
pred :: StatusType -> StatusType #
toEnum :: Int -> StatusType #
fromEnum :: StatusType -> Int #
enumFrom :: StatusType -> [StatusType] #
enumFromThen :: StatusType -> StatusType -> [StatusType] #
enumFromTo :: StatusType -> StatusType -> [StatusType] #
enumFromThenTo :: StatusType -> StatusType -> StatusType -> [StatusType] #
(==) :: StatusType -> StatusType -> Bool #
(/=) :: StatusType -> StatusType -> Bool #
showsPrec :: Int -> StatusType -> ShowS #
show :: StatusType -> String #
showList :: [StatusType] -> ShowS #
type Rep StatusType :: Type -> Type #
from :: StatusType -> Rep StatusType x #
to :: Rep StatusType x -> StatusType #
showbPrec :: Int -> StatusType -> Builder
showb :: StatusType -> Builder
showbList :: [StatusType] -> Builder
showtPrec :: Int -> StatusType -> Text
showt :: StatusType -> Text
showtList :: [StatusType] -> Text
showtlPrec :: Int -> StatusType -> Text
showtl :: StatusType -> Text
showtlList :: [StatusType] -> Text
parseJSON :: Value -> Parser StatusType
parseJSONList :: Value -> Parser [StatusType]
toJSON :: StatusType -> Value
toEncoding :: StatusType -> Encoding
toJSONList :: [StatusType] -> Value
toEncodingList :: [StatusType] -> Encoding