{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards   #-}
module Network.MQTT.Types (
  LastWill(..), MQTTPkt(..), QoS(..), qosFromInt,
  ConnectRequest(..), connectRequest, SessionReuse(..), ConnACKFlags(..), ConnACKRC(..),
  PublishRequest(..), PubACK(..), PubREC(..), PubREL(..), PubCOMP(..),
  ProtocolLevel(..), Property(..), AuthRequest(..),
  SubscribeRequest(..), SubOptions(..), subOptions, SubscribeResponse(..), SubErr(..),
  RetainHandling(..), DisconnectRequest(..),
  UnsubscribeRequest(..), UnsubscribeResponse(..), UnsubStatus(..), DiscoReason(..),
  PktID,
  parsePacket, ByteMe(toByteString), parseConnect,
  
  encodeLength, parseHdrLen, parseProperty, parseProperties, bsProps,
  parseSubOptions, ByteSize(..)
  ) where
import           Control.Applicative             (liftA2, (<|>))
import           Control.Monad                   (replicateM, when)
import           Data.Attoparsec.Binary          (anyWord16be, anyWord32be)
import qualified Data.Attoparsec.ByteString.Lazy as A
import           Data.Binary.Put                 (putWord32be, runPut)
import           Data.Bits                       (Bits (..), shiftL, testBit, (.&.), (.|.))
import qualified Data.ByteString.Lazy            as BL
import           Data.Functor                    (($>))
import           Data.Maybe                      (fromMaybe, isJust)
import           Data.Word                       (Word16, Word32, Word8)
data QoS = QoS0 | QoS1 | QoS2 deriving (QoS
QoS -> QoS -> Bounded QoS
forall a. a -> a -> Bounded a
maxBound :: QoS
$cmaxBound :: QoS
minBound :: QoS
$cminBound :: QoS
Bounded, Int -> QoS
QoS -> Int
QoS -> [QoS]
QoS -> QoS
QoS -> QoS -> [QoS]
QoS -> QoS -> QoS -> [QoS]
(QoS -> QoS)
-> (QoS -> QoS)
-> (Int -> QoS)
-> (QoS -> Int)
-> (QoS -> [QoS])
-> (QoS -> QoS -> [QoS])
-> (QoS -> QoS -> [QoS])
-> (QoS -> QoS -> QoS -> [QoS])
-> Enum QoS
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: QoS -> QoS -> QoS -> [QoS]
$cenumFromThenTo :: QoS -> QoS -> QoS -> [QoS]
enumFromTo :: QoS -> QoS -> [QoS]
$cenumFromTo :: QoS -> QoS -> [QoS]
enumFromThen :: QoS -> QoS -> [QoS]
$cenumFromThen :: QoS -> QoS -> [QoS]
enumFrom :: QoS -> [QoS]
$cenumFrom :: QoS -> [QoS]
fromEnum :: QoS -> Int
$cfromEnum :: QoS -> Int
toEnum :: Int -> QoS
$ctoEnum :: Int -> QoS
pred :: QoS -> QoS
$cpred :: QoS -> QoS
succ :: QoS -> QoS
$csucc :: QoS -> QoS
Enum, QoS -> QoS -> Bool
(QoS -> QoS -> Bool) -> (QoS -> QoS -> Bool) -> Eq QoS
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: QoS -> QoS -> Bool
$c/= :: QoS -> QoS -> Bool
== :: QoS -> QoS -> Bool
$c== :: QoS -> QoS -> Bool
Eq, Int -> QoS -> ShowS
[QoS] -> ShowS
QoS -> String
(Int -> QoS -> ShowS)
-> (QoS -> String) -> ([QoS] -> ShowS) -> Show QoS
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [QoS] -> ShowS
$cshowList :: [QoS] -> ShowS
show :: QoS -> String
$cshow :: QoS -> String
showsPrec :: Int -> QoS -> ShowS
$cshowsPrec :: Int -> QoS -> ShowS
Show, Eq QoS
Eq QoS
-> (QoS -> QoS -> Ordering)
-> (QoS -> QoS -> Bool)
-> (QoS -> QoS -> Bool)
-> (QoS -> QoS -> Bool)
-> (QoS -> QoS -> Bool)
-> (QoS -> QoS -> QoS)
-> (QoS -> QoS -> QoS)
-> Ord QoS
QoS -> QoS -> Bool
QoS -> QoS -> Ordering
QoS -> QoS -> QoS
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: QoS -> QoS -> QoS
$cmin :: QoS -> QoS -> QoS
max :: QoS -> QoS -> QoS
$cmax :: QoS -> QoS -> QoS
>= :: QoS -> QoS -> Bool
$c>= :: QoS -> QoS -> Bool
> :: QoS -> QoS -> Bool
$c> :: QoS -> QoS -> Bool
<= :: QoS -> QoS -> Bool
$c<= :: QoS -> QoS -> Bool
< :: QoS -> QoS -> Bool
$c< :: QoS -> QoS -> Bool
compare :: QoS -> QoS -> Ordering
$ccompare :: QoS -> QoS -> Ordering
$cp1Ord :: Eq QoS
Ord)
qosW :: QoS -> Word8
qosW :: QoS -> Word8
qosW = Int -> Word8
forall a. Enum a => Int -> a
toEnum (Int -> Word8) -> (QoS -> Int) -> QoS -> Word8
forall b c a. (b -> c) -> (a -> b) -> a -> c
. QoS -> Int
forall a. Enum a => a -> Int
fromEnum
wQos :: Word8 -> QoS
wQos :: Word8 -> QoS
wQos = Int -> QoS
forall a. Enum a => Int -> a
toEnum (Int -> QoS) -> (Word8 -> Int) -> Word8 -> QoS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Word8 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral
qosFromInt :: Int -> Maybe QoS
qosFromInt :: Int -> Maybe QoS
qosFromInt Int
0 = QoS -> Maybe QoS
forall a. a -> Maybe a
Just QoS
QoS0
qosFromInt Int
1 = QoS -> Maybe QoS
forall a. a -> Maybe a
Just QoS
QoS1
qosFromInt Int
2 = QoS -> Maybe QoS
forall a. a -> Maybe a
Just QoS
QoS2
qosFromInt Int
_ = Maybe QoS
forall a. Maybe a
Nothing
(≫) :: Bits a => a -> Int -> a
≫ :: a -> Int -> a
(≫) = a -> Int -> a
forall a. Bits a => a -> Int -> a
shiftR
(≪) :: Bits a => a -> Int -> a
≪ :: a -> Int -> a
(≪) = a -> Int -> a
forall a. Bits a => a -> Int -> a
shiftL
class ByteMe a where
  toBytes :: ProtocolLevel -> a -> [Word8]
  toBytes ProtocolLevel
p = ByteString -> [Word8]
BL.unpack (ByteString -> [Word8]) -> (a -> ByteString) -> a -> [Word8]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ProtocolLevel -> a -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p
  toByteString :: ProtocolLevel -> a -> BL.ByteString
  toByteString ProtocolLevel
p = [Word8] -> ByteString
BL.pack ([Word8] -> ByteString) -> (a -> [Word8]) -> a -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ProtocolLevel -> a -> [Word8]
forall a. ByteMe a => ProtocolLevel -> a -> [Word8]
toBytes ProtocolLevel
p
class ByteSize a where
  toByte :: a -> Word8
  fromByte :: Word8 -> a
boolBit :: Bool -> Word8
boolBit :: Bool -> Word8
boolBit Bool
False = Word8
0
boolBit Bool
True  = Word8
1
parseHdrLen :: A.Parser Int
parseHdrLen :: Parser Int
parseHdrLen = Parser Int
decodeVarInt
decodeVarInt :: A.Parser Int
decodeVarInt :: Parser Int
decodeVarInt = Int -> Int -> Parser Int
go Int
0 Int
1
  where
    go :: Int -> Int -> A.Parser Int
    go :: Int -> Int -> Parser Int
go Int
v Int
m = do
      Word8
x <- Parser Word8
A.anyWord8
      let a :: Int
a = Word8 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Word8
x Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
127) Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
m Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
v
      if Word8
x Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
128 Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
/= Word8
0
        then Int -> Int -> Parser Int
go Int
a (Int
mInt -> Int -> Int
forall a. Num a => a -> a -> a
*Int
128)
        else Int -> Parser Int
forall (f :: * -> *) a. Applicative f => a -> f a
pure Int
a
encodeLength :: Int -> [Word8]
encodeLength :: Int -> [Word8]
encodeLength = Int -> [Word8]
encodeVarInt
encodeVarInt :: Int -> [Word8]
encodeVarInt :: Int -> [Word8]
encodeVarInt Int
n = (Int, Int) -> [Word8]
go (Int
n Int -> Int -> (Int, Int)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Int
128)
  where
    go :: (Int, Int) -> [Word8]
go (Int
x,Int
e)
      | Int
x Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
0 = Int -> Word8
en (Int
e Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
128) Word8 -> [Word8] -> [Word8]
forall a. a -> [a] -> [a]
: (Int, Int) -> [Word8]
go (Int
x Int -> Int -> (Int, Int)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Int
128)
      | Bool
otherwise = [Int -> Word8
en Int
e]
    en :: Int -> Word8
    en :: Int -> Word8
en = Int -> Word8
forall a. Enum a => Int -> a
toEnum
encodeWord8 :: Word8 -> BL.ByteString
encodeWord8 :: Word8 -> ByteString
encodeWord8 = Word8 -> ByteString
BL.singleton
encodeWord16 :: Word16 -> BL.ByteString
encodeWord16 :: Word16 -> ByteString
encodeWord16 Word16
a = let (Word16
h,Word16
l) = Word16
a Word16 -> Word16 -> (Word16, Word16)
forall a. Integral a => a -> a -> (a, a)
`quotRem` Word16
256 in [Word8] -> ByteString
BL.pack [Word16 -> Word8
w Word16
h, Word16 -> Word8
w Word16
l]
    where w :: Word16 -> Word8
w = Int -> Word8
forall a. Enum a => Int -> a
toEnum (Int -> Word8) -> (Word16 -> Int) -> Word16 -> Word8
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Word16 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral
encodeWord32 :: Word32 -> BL.ByteString
encodeWord32 :: Word32 -> ByteString
encodeWord32 = Put -> ByteString
runPut (Put -> ByteString) -> (Word32 -> Put) -> Word32 -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Word32 -> Put
putWord32be
encodeBytes :: BL.ByteString -> BL.ByteString
encodeBytes :: ByteString -> ByteString
encodeBytes ByteString
x = ByteString -> ByteString
twoByteLen ByteString
x ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
x
encodeUTF8 :: BL.ByteString -> BL.ByteString
encodeUTF8 :: ByteString -> ByteString
encodeUTF8 = ByteString -> ByteString
encodeBytes
encodeUTF8Pair :: BL.ByteString -> BL.ByteString -> BL.ByteString
encodeUTF8Pair :: ByteString -> ByteString -> ByteString
encodeUTF8Pair ByteString
x ByteString
y = ByteString -> ByteString
encodeUTF8 ByteString
x ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
encodeUTF8 ByteString
y
twoByteLen :: BL.ByteString -> BL.ByteString
twoByteLen :: ByteString -> ByteString
twoByteLen = Word16 -> ByteString
encodeWord16 (Word16 -> ByteString)
-> (ByteString -> Word16) -> ByteString -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int64 -> Word16
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64 -> Word16) -> (ByteString -> Int64) -> ByteString -> Word16
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Int64
BL.length
blLength :: BL.ByteString -> BL.ByteString
blLength :: ByteString -> ByteString
blLength = [Word8] -> ByteString
BL.pack ([Word8] -> ByteString)
-> (ByteString -> [Word8]) -> ByteString -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> [Word8]
encodeVarInt (Int -> [Word8]) -> (ByteString -> Int) -> ByteString -> [Word8]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int64 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64 -> Int) -> (ByteString -> Int64) -> ByteString -> Int
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Int64
BL.length
withLength :: BL.ByteString -> BL.ByteString
withLength :: ByteString -> ByteString
withLength ByteString
a = ByteString -> ByteString
blLength ByteString
a ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
a
instance ByteMe BL.ByteString where
  toByteString :: ProtocolLevel -> ByteString -> ByteString
toByteString ProtocolLevel
_ ByteString
a = (Word16 -> ByteString
encodeWord16 (Word16 -> ByteString)
-> (ByteString -> Word16) -> ByteString -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int64 -> Word16
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64 -> Word16) -> (ByteString -> Int64) -> ByteString -> Word16
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Int64
BL.length) ByteString
a ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
a
data Property = PropPayloadFormatIndicator Word8
              | PropMessageExpiryInterval Word32
              | PropContentType BL.ByteString
              | PropResponseTopic BL.ByteString
              | PropCorrelationData BL.ByteString
              | PropSubscriptionIdentifier Int
              | PropSessionExpiryInterval Word32
              | PropAssignedClientIdentifier BL.ByteString
              | PropServerKeepAlive Word16
              | PropAuthenticationMethod BL.ByteString
              | PropAuthenticationData BL.ByteString
              | PropRequestProblemInformation Word8
              | PropWillDelayInterval Word32
              | PropRequestResponseInformation Word8
              | PropResponseInformation BL.ByteString
              | PropServerReference BL.ByteString
              | PropReasonString BL.ByteString
              | PropReceiveMaximum Word16
              | PropTopicAliasMaximum Word16
              | PropTopicAlias Word16
              | PropMaximumQoS Word8
              | PropRetainAvailable Word8
              | PropUserProperty BL.ByteString BL.ByteString
              | PropMaximumPacketSize Word32
              | PropWildcardSubscriptionAvailable Word8
              | PropSubscriptionIdentifierAvailable Word8
              | PropSharedSubscriptionAvailable Word8
              deriving (Int -> Property -> ShowS
[Property] -> ShowS
Property -> String
(Int -> Property -> ShowS)
-> (Property -> String) -> ([Property] -> ShowS) -> Show Property
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Property] -> ShowS
$cshowList :: [Property] -> ShowS
show :: Property -> String
$cshow :: Property -> String
showsPrec :: Int -> Property -> ShowS
$cshowsPrec :: Int -> Property -> ShowS
Show, Property -> Property -> Bool
(Property -> Property -> Bool)
-> (Property -> Property -> Bool) -> Eq Property
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Property -> Property -> Bool
$c/= :: Property -> Property -> Bool
== :: Property -> Property -> Bool
$c== :: Property -> Property -> Bool
Eq)
peW8 :: Word8 -> Word8 -> BL.ByteString
peW8 :: Word8 -> Word8 -> ByteString
peW8 Word8
i Word8
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word8 -> ByteString
encodeWord8 Word8
x
peW16 :: Word8 -> Word16 -> BL.ByteString
peW16 :: Word8 -> Word16 -> ByteString
peW16 Word8
i Word16
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word16 -> ByteString
encodeWord16 Word16
x
peW32 :: Word8 -> Word32 -> BL.ByteString
peW32 :: Word8 -> Word32 -> ByteString
peW32 Word8
i Word32
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word32 -> ByteString
encodeWord32 Word32
x
peUTF8 :: Word8 -> BL.ByteString -> BL.ByteString
peUTF8 :: Word8 -> ByteString -> ByteString
peUTF8 Word8
i ByteString
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
encodeUTF8 ByteString
x
peBin :: Word8 -> BL.ByteString -> BL.ByteString
peBin :: Word8 -> ByteString -> ByteString
peBin Word8
i ByteString
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
encodeBytes ByteString
x
peVarInt :: Word8 -> Int -> BL.ByteString
peVarInt :: Word8 -> Int -> ByteString
peVarInt Word8
i Int
x = Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ([Word8] -> ByteString
BL.pack ([Word8] -> ByteString) -> (Int -> [Word8]) -> Int -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> [Word8]
encodeVarInt) Int
x
instance ByteMe Property where
  toByteString :: ProtocolLevel -> Property -> ByteString
toByteString ProtocolLevel
_ (PropPayloadFormatIndicator Word8
x)          = Word8 -> Word8 -> ByteString
peW8 Word8
0x01 Word8
x
  toByteString ProtocolLevel
_ (PropMessageExpiryInterval Word32
x)           = Word8 -> Word32 -> ByteString
peW32 Word8
0x02 Word32
x
  toByteString ProtocolLevel
_ (PropContentType ByteString
x)                     = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x03 ByteString
x
  toByteString ProtocolLevel
_ (PropResponseTopic ByteString
x)                   = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x08 ByteString
x
  toByteString ProtocolLevel
_ (PropCorrelationData ByteString
x)                 = Word8 -> ByteString -> ByteString
peBin Word8
0x09 ByteString
x
  toByteString ProtocolLevel
_ (PropSubscriptionIdentifier Int
x)          = Word8 -> Int -> ByteString
peVarInt Word8
0x0b Int
x
  toByteString ProtocolLevel
_ (PropSessionExpiryInterval Word32
x)           = Word8 -> Word32 -> ByteString
peW32 Word8
0x11 Word32
x
  toByteString ProtocolLevel
_ (PropAssignedClientIdentifier ByteString
x)        = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x12 ByteString
x
  toByteString ProtocolLevel
_ (PropServerKeepAlive Word16
x)                 = Word8 -> Word16 -> ByteString
peW16 Word8
0x13 Word16
x
  toByteString ProtocolLevel
_ (PropAuthenticationMethod ByteString
x)            = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x15 ByteString
x
  toByteString ProtocolLevel
_ (PropAuthenticationData ByteString
x)              = Word8 -> ByteString -> ByteString
peBin Word8
0x16 ByteString
x
  toByteString ProtocolLevel
_ (PropRequestProblemInformation Word8
x)       = Word8 -> Word8 -> ByteString
peW8 Word8
0x17 Word8
x
  toByteString ProtocolLevel
_ (PropWillDelayInterval Word32
x)               = Word8 -> Word32 -> ByteString
peW32 Word8
0x18 Word32
x
  toByteString ProtocolLevel
_ (PropRequestResponseInformation Word8
x)      = Word8 -> Word8 -> ByteString
peW8 Word8
0x19 Word8
x
  toByteString ProtocolLevel
_ (PropResponseInformation ByteString
x)             = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x1a ByteString
x
  toByteString ProtocolLevel
_ (PropServerReference ByteString
x)                 = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x1c ByteString
x
  toByteString ProtocolLevel
_ (PropReasonString ByteString
x)                    = Word8 -> ByteString -> ByteString
peUTF8 Word8
0x1f ByteString
x
  toByteString ProtocolLevel
_ (PropReceiveMaximum Word16
x)                  = Word8 -> Word16 -> ByteString
peW16 Word8
0x21 Word16
x
  toByteString ProtocolLevel
_ (PropTopicAliasMaximum Word16
x)               = Word8 -> Word16 -> ByteString
peW16 Word8
0x22 Word16
x
  toByteString ProtocolLevel
_ (PropTopicAlias Word16
x)                      = Word8 -> Word16 -> ByteString
peW16 Word8
0x23 Word16
x
  toByteString ProtocolLevel
_ (PropMaximumQoS Word8
x)                      = Word8 -> Word8 -> ByteString
peW8 Word8
0x24 Word8
x
  toByteString ProtocolLevel
_ (PropRetainAvailable Word8
x)                 = Word8 -> Word8 -> ByteString
peW8 Word8
0x25 Word8
x
  toByteString ProtocolLevel
_ (PropUserProperty ByteString
k ByteString
v)                  = Word8 -> ByteString
BL.singleton Word8
0x26 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString -> ByteString
encodeUTF8Pair ByteString
k ByteString
v
  toByteString ProtocolLevel
_ (PropMaximumPacketSize Word32
x)               = Word8 -> Word32 -> ByteString
peW32 Word8
0x27 Word32
x
  toByteString ProtocolLevel
_ (PropWildcardSubscriptionAvailable Word8
x)   = Word8 -> Word8 -> ByteString
peW8 Word8
0x28 Word8
x
  toByteString ProtocolLevel
_ (PropSubscriptionIdentifierAvailable Word8
x) = Word8 -> Word8 -> ByteString
peW8 Word8
0x29 Word8
x
  toByteString ProtocolLevel
_ (PropSharedSubscriptionAvailable Word8
x)     = Word8 -> Word8 -> ByteString
peW8 Word8
0x2a Word8
x
parseProperty :: A.Parser Property
parseProperty :: Parser Property
parseProperty = (Word8 -> Parser Word8
A.word8 Word8
0x01 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropPayloadFormatIndicator (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x02 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word32 -> Property
PropMessageExpiryInterval (Word32 -> Property) -> Parser ByteString Word32 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word32
aWord32)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x03 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropContentType (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x08 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropResponseTopic (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x09 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropCorrelationData (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x0b Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Int -> Property
PropSubscriptionIdentifier (Int -> Property) -> Parser Int -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Int
decodeVarInt)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x11 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word32 -> Property
PropSessionExpiryInterval (Word32 -> Property) -> Parser ByteString Word32 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word32
aWord32)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x12 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropAssignedClientIdentifier (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x13 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word16 -> Property
PropServerKeepAlive (Word16 -> Property) -> Parser ByteString Word16 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word16
aWord16)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x15 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropAuthenticationMethod (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x16 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropAuthenticationData (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x17 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropRequestProblemInformation (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x18 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word32 -> Property
PropWillDelayInterval (Word32 -> Property) -> Parser ByteString Word32 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word32
aWord32)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x19 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropRequestResponseInformation (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x1a Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropResponseInformation (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x1c Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropServerReference (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x1f Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> Property
PropReasonString (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x21 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word16 -> Property
PropReceiveMaximum (Word16 -> Property) -> Parser ByteString Word16 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word16
aWord16)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x22 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word16 -> Property
PropTopicAliasMaximum (Word16 -> Property) -> Parser ByteString Word16 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word16
aWord16)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x23 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word16 -> Property
PropTopicAlias (Word16 -> Property) -> Parser ByteString Word16 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word16
aWord16)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x24 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropMaximumQoS (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x25 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropRetainAvailable (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x26 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> ByteString -> ByteString -> Property
PropUserProperty (ByteString -> ByteString -> Property)
-> Parser ByteString ByteString
-> Parser ByteString (ByteString -> Property)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString Parser ByteString (ByteString -> Property)
-> Parser ByteString ByteString -> Parser Property
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Parser ByteString ByteString
aString)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x27 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word32 -> Property
PropMaximumPacketSize (Word32 -> Property) -> Parser ByteString Word32 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString Word32
aWord32)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x28 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropWildcardSubscriptionAvailable (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x29 Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropSubscriptionIdentifierAvailable (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
                Parser Property -> Parser Property -> Parser Property
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (Word8 -> Parser Word8
A.word8 Word8
0x2a Parser Word8 -> Parser Property -> Parser Property
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Word8 -> Property
PropSharedSubscriptionAvailable (Word8 -> Property) -> Parser Word8 -> Parser Property
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
bsProps :: ProtocolLevel -> [Property] -> BL.ByteString
bsProps :: ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
Protocol311 [Property]
_ = ByteString
forall a. Monoid a => a
mempty
bsProps ProtocolLevel
p [Property]
l = let b :: ByteString
b = (Property -> ByteString) -> [Property] -> ByteString
forall (t :: * -> *) m a.
(Foldable t, Monoid m) =>
(a -> m) -> t a -> m
foldMap (ProtocolLevel -> Property -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p) [Property]
l in
                ([Word8] -> ByteString
BL.pack ([Word8] -> ByteString)
-> (ByteString -> [Word8]) -> ByteString -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> [Word8]
encodeLength (Int -> [Word8]) -> (ByteString -> Int) -> ByteString -> [Word8]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int64 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64 -> Int) -> (ByteString -> Int64) -> ByteString -> Int
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> Int64
BL.length) ByteString
b ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
b
parseProperties :: ProtocolLevel -> A.Parser [Property]
parseProperties :: ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
Protocol311 = [Property] -> Parser [Property]
forall (f :: * -> *) a. Applicative f => a -> f a
pure [Property]
forall a. Monoid a => a
mempty
parseProperties ProtocolLevel
Protocol50 = do
  Int
len <- Parser Int
decodeVarInt
  (String -> Parser [Property])
-> ([Property] -> Parser [Property])
-> Either String [Property]
-> Parser [Property]
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either String -> Parser [Property]
forall (m :: * -> *) a. MonadFail m => String -> m a
fail [Property] -> Parser [Property]
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Either String [Property] -> Parser [Property])
-> (ByteString -> Either String [Property])
-> ByteString
-> Parser [Property]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Parser [Property] -> ByteString -> Either String [Property]
forall a. Parser a -> ByteString -> Either String a
A.parseOnly (Parser Property -> Parser [Property]
forall (m :: * -> *) a. MonadPlus m => m a -> m [a]
A.many' Parser Property
parseProperty) (ByteString -> Parser [Property])
-> Parser ByteString ByteString -> Parser [Property]
forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< Int -> Parser ByteString ByteString
A.take Int
len
data ProtocolLevel = Protocol311 
                   | Protocol50  
                   deriving(ProtocolLevel
ProtocolLevel -> ProtocolLevel -> Bounded ProtocolLevel
forall a. a -> a -> Bounded a
maxBound :: ProtocolLevel
$cmaxBound :: ProtocolLevel
minBound :: ProtocolLevel
$cminBound :: ProtocolLevel
Bounded, Int -> ProtocolLevel
ProtocolLevel -> Int
ProtocolLevel -> [ProtocolLevel]
ProtocolLevel -> ProtocolLevel
ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
ProtocolLevel -> ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
(ProtocolLevel -> ProtocolLevel)
-> (ProtocolLevel -> ProtocolLevel)
-> (Int -> ProtocolLevel)
-> (ProtocolLevel -> Int)
-> (ProtocolLevel -> [ProtocolLevel])
-> (ProtocolLevel -> ProtocolLevel -> [ProtocolLevel])
-> (ProtocolLevel -> ProtocolLevel -> [ProtocolLevel])
-> (ProtocolLevel
    -> ProtocolLevel -> ProtocolLevel -> [ProtocolLevel])
-> Enum ProtocolLevel
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: ProtocolLevel -> ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
$cenumFromThenTo :: ProtocolLevel -> ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
enumFromTo :: ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
$cenumFromTo :: ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
enumFromThen :: ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
$cenumFromThen :: ProtocolLevel -> ProtocolLevel -> [ProtocolLevel]
enumFrom :: ProtocolLevel -> [ProtocolLevel]
$cenumFrom :: ProtocolLevel -> [ProtocolLevel]
fromEnum :: ProtocolLevel -> Int
$cfromEnum :: ProtocolLevel -> Int
toEnum :: Int -> ProtocolLevel
$ctoEnum :: Int -> ProtocolLevel
pred :: ProtocolLevel -> ProtocolLevel
$cpred :: ProtocolLevel -> ProtocolLevel
succ :: ProtocolLevel -> ProtocolLevel
$csucc :: ProtocolLevel -> ProtocolLevel
Enum, ProtocolLevel -> ProtocolLevel -> Bool
(ProtocolLevel -> ProtocolLevel -> Bool)
-> (ProtocolLevel -> ProtocolLevel -> Bool) -> Eq ProtocolLevel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ProtocolLevel -> ProtocolLevel -> Bool
$c/= :: ProtocolLevel -> ProtocolLevel -> Bool
== :: ProtocolLevel -> ProtocolLevel -> Bool
$c== :: ProtocolLevel -> ProtocolLevel -> Bool
Eq, Int -> ProtocolLevel -> ShowS
[ProtocolLevel] -> ShowS
ProtocolLevel -> String
(Int -> ProtocolLevel -> ShowS)
-> (ProtocolLevel -> String)
-> ([ProtocolLevel] -> ShowS)
-> Show ProtocolLevel
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ProtocolLevel] -> ShowS
$cshowList :: [ProtocolLevel] -> ShowS
show :: ProtocolLevel -> String
$cshow :: ProtocolLevel -> String
showsPrec :: Int -> ProtocolLevel -> ShowS
$cshowsPrec :: Int -> ProtocolLevel -> ShowS
Show)
instance ByteMe ProtocolLevel where
  toByteString :: ProtocolLevel -> ProtocolLevel -> ByteString
toByteString ProtocolLevel
_ ProtocolLevel
Protocol311 = Word8 -> ByteString
BL.singleton Word8
4
  toByteString ProtocolLevel
_ ProtocolLevel
Protocol50  = Word8 -> ByteString
BL.singleton Word8
5
data LastWill = LastWill {
  LastWill -> Bool
_willRetain  :: Bool
  , LastWill -> QoS
_willQoS   :: QoS
  , LastWill -> ByteString
_willTopic :: BL.ByteString
  , LastWill -> ByteString
_willMsg   :: BL.ByteString
  , LastWill -> [Property]
_willProps :: [Property]
  } deriving(LastWill -> LastWill -> Bool
(LastWill -> LastWill -> Bool)
-> (LastWill -> LastWill -> Bool) -> Eq LastWill
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LastWill -> LastWill -> Bool
$c/= :: LastWill -> LastWill -> Bool
== :: LastWill -> LastWill -> Bool
$c== :: LastWill -> LastWill -> Bool
Eq, Int -> LastWill -> ShowS
[LastWill] -> ShowS
LastWill -> String
(Int -> LastWill -> ShowS)
-> (LastWill -> String) -> ([LastWill] -> ShowS) -> Show LastWill
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LastWill] -> ShowS
$cshowList :: [LastWill] -> ShowS
show :: LastWill -> String
$cshow :: LastWill -> String
showsPrec :: Int -> LastWill -> ShowS
$cshowsPrec :: Int -> LastWill -> ShowS
Show)
data ConnectRequest = ConnectRequest {
  ConnectRequest -> Maybe ByteString
_username         :: Maybe BL.ByteString
  , ConnectRequest -> Maybe ByteString
_password       :: Maybe BL.ByteString
  , ConnectRequest -> Maybe LastWill
_lastWill       :: Maybe LastWill
  , ConnectRequest -> Bool
_cleanSession   :: Bool
  , ConnectRequest -> Word16
_keepAlive      :: Word16
  , ConnectRequest -> ByteString
_connID         :: BL.ByteString
  , ConnectRequest -> [Property]
_connProperties :: [Property]
  } deriving (ConnectRequest -> ConnectRequest -> Bool
(ConnectRequest -> ConnectRequest -> Bool)
-> (ConnectRequest -> ConnectRequest -> Bool) -> Eq ConnectRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ConnectRequest -> ConnectRequest -> Bool
$c/= :: ConnectRequest -> ConnectRequest -> Bool
== :: ConnectRequest -> ConnectRequest -> Bool
$c== :: ConnectRequest -> ConnectRequest -> Bool
Eq, Int -> ConnectRequest -> ShowS
[ConnectRequest] -> ShowS
ConnectRequest -> String
(Int -> ConnectRequest -> ShowS)
-> (ConnectRequest -> String)
-> ([ConnectRequest] -> ShowS)
-> Show ConnectRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ConnectRequest] -> ShowS
$cshowList :: [ConnectRequest] -> ShowS
show :: ConnectRequest -> String
$cshow :: ConnectRequest -> String
showsPrec :: Int -> ConnectRequest -> ShowS
$cshowsPrec :: Int -> ConnectRequest -> ShowS
Show)
connectRequest :: ConnectRequest
connectRequest :: ConnectRequest
connectRequest = ConnectRequest :: Maybe ByteString
-> Maybe ByteString
-> Maybe LastWill
-> Bool
-> Word16
-> ByteString
-> [Property]
-> ConnectRequest
ConnectRequest{_username :: Maybe ByteString
_username=Maybe ByteString
forall a. Maybe a
Nothing, _password :: Maybe ByteString
_password=Maybe ByteString
forall a. Maybe a
Nothing, _lastWill :: Maybe LastWill
_lastWill=Maybe LastWill
forall a. Maybe a
Nothing,
                                _cleanSession :: Bool
_cleanSession=Bool
True, _keepAlive :: Word16
_keepAlive=Word16
300, _connID :: ByteString
_connID=ByteString
"",
                                _connProperties :: [Property]
_connProperties=[Property]
forall a. Monoid a => a
mempty}
instance ByteMe ConnectRequest where
  toByteString :: ProtocolLevel -> ConnectRequest -> ByteString
toByteString ProtocolLevel
prot ConnectRequest{Bool
[Property]
Maybe ByteString
Maybe LastWill
Word16
ByteString
_connProperties :: [Property]
_connID :: ByteString
_keepAlive :: Word16
_cleanSession :: Bool
_lastWill :: Maybe LastWill
_password :: Maybe ByteString
_username :: Maybe ByteString
_connProperties :: ConnectRequest -> [Property]
_connID :: ConnectRequest -> ByteString
_keepAlive :: ConnectRequest -> Word16
_cleanSession :: ConnectRequest -> Bool
_lastWill :: ConnectRequest -> Maybe LastWill
_password :: ConnectRequest -> Maybe ByteString
_username :: ConnectRequest -> Maybe ByteString
..} = Word8 -> ByteString
BL.singleton Word8
0x10 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (ProtocolLevel -> ByteString
val ProtocolLevel
prot)
    where
      val :: ProtocolLevel -> BL.ByteString
      val :: ProtocolLevel -> ByteString
val ProtocolLevel
Protocol311 = ByteString
"\NUL\EOTMQTT\EOT" 
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word8 -> ByteString
BL.singleton Word8
connBits
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word16 -> ByteString
encodeWord16 Word16
_keepAlive
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
_connID
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Maybe LastWill -> ByteString
lwt Maybe LastWill
_lastWill
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Maybe ByteString -> ByteString
perhaps Maybe ByteString
_username
                        ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> if Maybe ByteString -> Bool
forall a. Maybe a -> Bool
isJust Maybe ByteString
_username then Maybe ByteString -> ByteString
perhaps Maybe ByteString
_password else ByteString
""
      val ProtocolLevel
Protocol50 = ByteString
"\NUL\EOTMQTT\ENQ" 
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word8 -> ByteString
BL.singleton Word8
connBits
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word16 -> ByteString
encodeWord16 Word16
_keepAlive
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
_connProperties
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
_connID
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Maybe LastWill -> ByteString
lwt Maybe LastWill
_lastWill
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Maybe ByteString -> ByteString
perhaps Maybe ByteString
_username
                       ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Maybe ByteString -> ByteString
perhaps Maybe ByteString
_password
      connBits :: Word8
connBits = Word8
hasu Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
hasp Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
willBits Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
clean
        where
          hasu :: Word8
hasu = Bool -> Word8
boolBit (Maybe ByteString -> Bool
forall a. Maybe a -> Bool
isJust Maybe ByteString
_username) Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
7
          hasp :: Word8
hasp = Bool -> Word8
boolBit ((ProtocolLevel
prot ProtocolLevel -> ProtocolLevel -> Bool
forall a. Eq a => a -> a -> Bool
== ProtocolLevel
Protocol50 Bool -> Bool -> Bool
|| Maybe ByteString -> Bool
forall a. Maybe a -> Bool
isJust Maybe ByteString
_username) Bool -> Bool -> Bool
&& Maybe ByteString -> Bool
forall a. Maybe a -> Bool
isJust Maybe ByteString
_password) Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
6
          clean :: Word8
clean = Bool -> Word8
boolBit Bool
_cleanSession Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
1
          willBits :: Word8
willBits = case Maybe LastWill
_lastWill of
                       Maybe LastWill
Nothing           -> Word8
0
                       Just LastWill{Bool
[Property]
ByteString
QoS
_willProps :: [Property]
_willMsg :: ByteString
_willTopic :: ByteString
_willQoS :: QoS
_willRetain :: Bool
_willProps :: LastWill -> [Property]
_willMsg :: LastWill -> ByteString
_willTopic :: LastWill -> ByteString
_willQoS :: LastWill -> QoS
_willRetain :: LastWill -> Bool
..} -> Word8
4 Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. ((QoS -> Word8
qosW QoS
_willQoS Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0x3) Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
3) Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. (Bool -> Word8
boolBit Bool
_willRetain Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
5)
      lwt :: Maybe LastWill -> BL.ByteString
      lwt :: Maybe LastWill -> ByteString
lwt Maybe LastWill
Nothing = ByteString
forall a. Monoid a => a
mempty
      lwt (Just LastWill{Bool
[Property]
ByteString
QoS
_willProps :: [Property]
_willMsg :: ByteString
_willTopic :: ByteString
_willQoS :: QoS
_willRetain :: Bool
_willProps :: LastWill -> [Property]
_willMsg :: LastWill -> ByteString
_willTopic :: LastWill -> ByteString
_willQoS :: LastWill -> QoS
_willRetain :: LastWill -> Bool
..}) = ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
_willProps
                                ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
_willTopic
                                ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
_willMsg
      perhaps :: Maybe BL.ByteString -> BL.ByteString
      perhaps :: Maybe ByteString -> ByteString
perhaps Maybe ByteString
Nothing  = ByteString
""
      perhaps (Just ByteString
s) = ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
s
data MQTTPkt = ConnPkt ConnectRequest ProtocolLevel
             | ConnACKPkt ConnACKFlags
             | PublishPkt PublishRequest
             | PubACKPkt PubACK
             | PubRECPkt PubREC
             | PubRELPkt PubREL
             | PubCOMPPkt PubCOMP
             | SubscribePkt SubscribeRequest
             | SubACKPkt SubscribeResponse
             | UnsubscribePkt UnsubscribeRequest
             | UnsubACKPkt UnsubscribeResponse
             | PingPkt
             | PongPkt
             | DisconnectPkt DisconnectRequest
             | AuthPkt AuthRequest
  deriving (MQTTPkt -> MQTTPkt -> Bool
(MQTTPkt -> MQTTPkt -> Bool)
-> (MQTTPkt -> MQTTPkt -> Bool) -> Eq MQTTPkt
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: MQTTPkt -> MQTTPkt -> Bool
$c/= :: MQTTPkt -> MQTTPkt -> Bool
== :: MQTTPkt -> MQTTPkt -> Bool
$c== :: MQTTPkt -> MQTTPkt -> Bool
Eq, Int -> MQTTPkt -> ShowS
[MQTTPkt] -> ShowS
MQTTPkt -> String
(Int -> MQTTPkt -> ShowS)
-> (MQTTPkt -> String) -> ([MQTTPkt] -> ShowS) -> Show MQTTPkt
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [MQTTPkt] -> ShowS
$cshowList :: [MQTTPkt] -> ShowS
show :: MQTTPkt -> String
$cshow :: MQTTPkt -> String
showsPrec :: Int -> MQTTPkt -> ShowS
$cshowsPrec :: Int -> MQTTPkt -> ShowS
Show)
instance ByteMe MQTTPkt where
  toByteString :: ProtocolLevel -> MQTTPkt -> ByteString
toByteString ProtocolLevel
p (ConnPkt ConnectRequest
x ProtocolLevel
_)      = ProtocolLevel -> ConnectRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p ConnectRequest
x
  toByteString ProtocolLevel
p (ConnACKPkt ConnACKFlags
x)     = ProtocolLevel -> ConnACKFlags -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p ConnACKFlags
x
  toByteString ProtocolLevel
p (PublishPkt PublishRequest
x)     = ProtocolLevel -> PublishRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p PublishRequest
x
  toByteString ProtocolLevel
p (PubACKPkt PubACK
x)      = ProtocolLevel -> PubACK -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p PubACK
x
  toByteString ProtocolLevel
p (PubRELPkt PubREL
x)      = ProtocolLevel -> PubREL -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p PubREL
x
  toByteString ProtocolLevel
p (PubRECPkt PubREC
x)      = ProtocolLevel -> PubREC -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p PubREC
x
  toByteString ProtocolLevel
p (PubCOMPPkt PubCOMP
x)     = ProtocolLevel -> PubCOMP -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p PubCOMP
x
  toByteString ProtocolLevel
p (SubscribePkt SubscribeRequest
x)   = ProtocolLevel -> SubscribeRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p SubscribeRequest
x
  toByteString ProtocolLevel
p (SubACKPkt SubscribeResponse
x)      = ProtocolLevel -> SubscribeResponse -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p SubscribeResponse
x
  toByteString ProtocolLevel
p (UnsubscribePkt UnsubscribeRequest
x) = ProtocolLevel -> UnsubscribeRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p UnsubscribeRequest
x
  toByteString ProtocolLevel
p (UnsubACKPkt UnsubscribeResponse
x)    = ProtocolLevel -> UnsubscribeResponse -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p UnsubscribeResponse
x
  toByteString ProtocolLevel
_ MQTTPkt
PingPkt            = ByteString
"\192\NUL"
  toByteString ProtocolLevel
_ MQTTPkt
PongPkt            = ByteString
"\208\NUL"
  toByteString ProtocolLevel
p (DisconnectPkt DisconnectRequest
x)  = ProtocolLevel -> DisconnectRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p DisconnectRequest
x
  toByteString ProtocolLevel
p (AuthPkt AuthRequest
x)        = ProtocolLevel -> AuthRequest -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
p AuthRequest
x
parsePacket :: ProtocolLevel -> A.Parser MQTTPkt
parsePacket :: ProtocolLevel -> Parser MQTTPkt
parsePacket ProtocolLevel
p = Parser MQTTPkt
parseConnect Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parseConnectACK
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parsePublish ProtocolLevel
p Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parsePubACK
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parsePubREC Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parsePubREL Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parsePubCOMP
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parseSubscribe ProtocolLevel
p Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parseSubACK ProtocolLevel
p
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parseUnsubscribe ProtocolLevel
p Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parseUnsubACK ProtocolLevel
p
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> MQTTPkt
PingPkt MQTTPkt -> Parser ByteString ByteString -> Parser MQTTPkt
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ ByteString -> Parser ByteString ByteString
A.string ByteString
"\192\NUL" Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> MQTTPkt
PongPkt MQTTPkt -> Parser ByteString ByteString -> Parser MQTTPkt
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ ByteString -> Parser ByteString ByteString
A.string ByteString
"\208\NUL"
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ProtocolLevel -> Parser MQTTPkt
parseDisconnect ProtocolLevel
p
                Parser MQTTPkt -> Parser MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> Parser MQTTPkt
parseAuth
aWord16 :: A.Parser Word16
aWord16 :: Parser ByteString Word16
aWord16 = Parser ByteString Word16
anyWord16be
aWord32 :: A.Parser Word32
aWord32 :: Parser ByteString Word32
aWord32 = Parser ByteString Word32
anyWord32be
aString :: A.Parser BL.ByteString
aString :: Parser ByteString ByteString
aString = do
  Word16
n <- Parser ByteString Word16
aWord16
  ByteString
s <- Int -> Parser ByteString ByteString
A.take (Word16 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral Word16
n)
  ByteString -> Parser ByteString ByteString
forall (f :: * -> *) a. Applicative f => a -> f a
pure (ByteString -> Parser ByteString ByteString)
-> ByteString -> Parser ByteString ByteString
forall a b. (a -> b) -> a -> b
$ ByteString -> ByteString
BL.fromStrict ByteString
s
parseConnect :: A.Parser MQTTPkt
parseConnect :: Parser MQTTPkt
parseConnect = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x10
  Int
_ <- Parser Int
parseHdrLen
  ByteString
_ <- ByteString -> Parser ByteString ByteString
A.string ByteString
"\NUL\EOTMQTT" 
  ProtocolLevel
pl <- Parser ByteString ProtocolLevel
parseLevel
  Word8
connFlagBits <- Parser Word8
A.anyWord8
  Word16
keepAlive <- Parser ByteString Word16
aWord16
  [Property]
props <- ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
pl
  ByteString
cid <- Parser ByteString ByteString
aString
  Maybe LastWill
lwt <- ProtocolLevel -> Word8 -> Parser ByteString (Maybe LastWill)
parseLwt ProtocolLevel
pl Word8
connFlagBits
  Maybe ByteString
u <- Bool -> Parser (Maybe ByteString)
mstr (Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
connFlagBits Int
7)
  Maybe ByteString
p <- Bool -> Parser (Maybe ByteString)
mstr (Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
connFlagBits Int
6)
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ ConnectRequest -> ProtocolLevel -> MQTTPkt
ConnPkt ConnectRequest :: Maybe ByteString
-> Maybe ByteString
-> Maybe LastWill
-> Bool
-> Word16
-> ByteString
-> [Property]
-> ConnectRequest
ConnectRequest{_connID :: ByteString
_connID=ByteString
cid, _username :: Maybe ByteString
_username=Maybe ByteString
u, _password :: Maybe ByteString
_password=Maybe ByteString
p,
                                _lastWill :: Maybe LastWill
_lastWill=Maybe LastWill
lwt, _keepAlive :: Word16
_keepAlive=Word16
keepAlive,
                                _cleanSession :: Bool
_cleanSession=Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
connFlagBits Int
1,
                                _connProperties :: [Property]
_connProperties=[Property]
props} ProtocolLevel
pl
  where
    mstr :: Bool -> A.Parser (Maybe BL.ByteString)
    mstr :: Bool -> Parser (Maybe ByteString)
mstr Bool
False = Maybe ByteString -> Parser (Maybe ByteString)
forall (f :: * -> *) a. Applicative f => a -> f a
pure Maybe ByteString
forall a. Maybe a
Nothing
    mstr Bool
True  = ByteString -> Maybe ByteString
forall a. a -> Maybe a
Just (ByteString -> Maybe ByteString)
-> Parser ByteString ByteString -> Parser (Maybe ByteString)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser ByteString ByteString
aString
    parseLevel :: Parser ByteString ProtocolLevel
parseLevel = ByteString -> Parser ByteString ByteString
A.string ByteString
"\EOT" Parser ByteString ByteString
-> ProtocolLevel -> Parser ByteString ProtocolLevel
forall (f :: * -> *) a b. Functor f => f a -> b -> f b
$> ProtocolLevel
Protocol311
                 Parser ByteString ProtocolLevel
-> Parser ByteString ProtocolLevel
-> Parser ByteString ProtocolLevel
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> ByteString -> Parser ByteString ByteString
A.string ByteString
"\ENQ" Parser ByteString ByteString
-> ProtocolLevel -> Parser ByteString ProtocolLevel
forall (f :: * -> *) a b. Functor f => f a -> b -> f b
$> ProtocolLevel
Protocol50
    parseLwt :: ProtocolLevel -> Word8 -> Parser ByteString (Maybe LastWill)
parseLwt ProtocolLevel
pl Word8
bits
      | Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
bits Int
2 = do
          [Property]
props <- ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
pl
          ByteString
top <- Parser ByteString ByteString
aString
          ByteString
msg <- Parser ByteString ByteString
aString
          Maybe LastWill -> Parser ByteString (Maybe LastWill)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Maybe LastWill -> Parser ByteString (Maybe LastWill))
-> Maybe LastWill -> Parser ByteString (Maybe LastWill)
forall a b. (a -> b) -> a -> b
$ LastWill -> Maybe LastWill
forall a. a -> Maybe a
Just LastWill :: Bool -> QoS -> ByteString -> ByteString -> [Property] -> LastWill
LastWill{_willTopic :: ByteString
_willTopic=ByteString
top, _willMsg :: ByteString
_willMsg=ByteString
msg,
                               _willRetain :: Bool
_willRetain=Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
bits Int
5,
                               _willQoS :: QoS
_willQoS=Word8 -> QoS
wQos (Word8 -> QoS) -> Word8 -> QoS
forall a b. (a -> b) -> a -> b
$ (Word8
bits Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≫ Int
3) Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0x3,
                               _willProps :: [Property]
_willProps = [Property]
props}
      | Bool
otherwise = Maybe LastWill -> Parser ByteString (Maybe LastWill)
forall (f :: * -> *) a. Applicative f => a -> f a
pure Maybe LastWill
forall a. Maybe a
Nothing
data ConnACKRC = ConnAccepted
  
  | UnacceptableProtocol
  | IdentifierRejected
  | ServerUnavailable
  | BadCredentials
  | NotAuthorized
  
  | ConnUnspecifiedError
  | ConnMalformedPacket
  | ConnProtocolError
  | ConnImplementationSpecificError
  | ConnUnsupportedProtocolVersion
  | ConnClientIdentifierNotValid
  | ConnBadUserNameOrPassword
  | ConnNotAuthorized
  | ConnServerUnavailable
  | ConnServerBusy
  | ConnBanned
  | ConnBadAuthenticationMethod
  | ConnTopicNameInvalid
  | ConnPacketTooLarge
  | ConnQuotaExceeded
  | ConnPayloadFormatInvalid
  | ConnRetainNotSupported
  | ConnQosNotSupported
  | ConnUseAnotherServer
  | ConnServerMoved
  | ConnConnectionRateExceeded
  deriving(ConnACKRC -> ConnACKRC -> Bool
(ConnACKRC -> ConnACKRC -> Bool)
-> (ConnACKRC -> ConnACKRC -> Bool) -> Eq ConnACKRC
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ConnACKRC -> ConnACKRC -> Bool
$c/= :: ConnACKRC -> ConnACKRC -> Bool
== :: ConnACKRC -> ConnACKRC -> Bool
$c== :: ConnACKRC -> ConnACKRC -> Bool
Eq, Int -> ConnACKRC -> ShowS
[ConnACKRC] -> ShowS
ConnACKRC -> String
(Int -> ConnACKRC -> ShowS)
-> (ConnACKRC -> String)
-> ([ConnACKRC] -> ShowS)
-> Show ConnACKRC
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ConnACKRC] -> ShowS
$cshowList :: [ConnACKRC] -> ShowS
show :: ConnACKRC -> String
$cshow :: ConnACKRC -> String
showsPrec :: Int -> ConnACKRC -> ShowS
$cshowsPrec :: Int -> ConnACKRC -> ShowS
Show, ConnACKRC
ConnACKRC -> ConnACKRC -> Bounded ConnACKRC
forall a. a -> a -> Bounded a
maxBound :: ConnACKRC
$cmaxBound :: ConnACKRC
minBound :: ConnACKRC
$cminBound :: ConnACKRC
Bounded, Int -> ConnACKRC
ConnACKRC -> Int
ConnACKRC -> [ConnACKRC]
ConnACKRC -> ConnACKRC
ConnACKRC -> ConnACKRC -> [ConnACKRC]
ConnACKRC -> ConnACKRC -> ConnACKRC -> [ConnACKRC]
(ConnACKRC -> ConnACKRC)
-> (ConnACKRC -> ConnACKRC)
-> (Int -> ConnACKRC)
-> (ConnACKRC -> Int)
-> (ConnACKRC -> [ConnACKRC])
-> (ConnACKRC -> ConnACKRC -> [ConnACKRC])
-> (ConnACKRC -> ConnACKRC -> [ConnACKRC])
-> (ConnACKRC -> ConnACKRC -> ConnACKRC -> [ConnACKRC])
-> Enum ConnACKRC
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: ConnACKRC -> ConnACKRC -> ConnACKRC -> [ConnACKRC]
$cenumFromThenTo :: ConnACKRC -> ConnACKRC -> ConnACKRC -> [ConnACKRC]
enumFromTo :: ConnACKRC -> ConnACKRC -> [ConnACKRC]
$cenumFromTo :: ConnACKRC -> ConnACKRC -> [ConnACKRC]
enumFromThen :: ConnACKRC -> ConnACKRC -> [ConnACKRC]
$cenumFromThen :: ConnACKRC -> ConnACKRC -> [ConnACKRC]
enumFrom :: ConnACKRC -> [ConnACKRC]
$cenumFrom :: ConnACKRC -> [ConnACKRC]
fromEnum :: ConnACKRC -> Int
$cfromEnum :: ConnACKRC -> Int
toEnum :: Int -> ConnACKRC
$ctoEnum :: Int -> ConnACKRC
pred :: ConnACKRC -> ConnACKRC
$cpred :: ConnACKRC -> ConnACKRC
succ :: ConnACKRC -> ConnACKRC
$csucc :: ConnACKRC -> ConnACKRC
Enum)
instance ByteSize ConnACKRC where
  toByte :: ConnACKRC -> Word8
toByte ConnACKRC
ConnAccepted                    = Word8
0
  toByte ConnACKRC
UnacceptableProtocol            = Word8
1
  toByte ConnACKRC
IdentifierRejected              = Word8
2
  toByte ConnACKRC
ServerUnavailable               = Word8
3
  toByte ConnACKRC
BadCredentials                  = Word8
4
  toByte ConnACKRC
NotAuthorized                   = Word8
5
  toByte ConnACKRC
ConnUnspecifiedError            = Word8
0x80
  toByte ConnACKRC
ConnMalformedPacket             = Word8
0x81
  toByte ConnACKRC
ConnProtocolError               = Word8
0x82
  toByte ConnACKRC
ConnImplementationSpecificError = Word8
0x83
  toByte ConnACKRC
ConnUnsupportedProtocolVersion  = Word8
0x84
  toByte ConnACKRC
ConnClientIdentifierNotValid    = Word8
0x85
  toByte ConnACKRC
ConnBadUserNameOrPassword       = Word8
0x86
  toByte ConnACKRC
ConnNotAuthorized               = Word8
0x87
  toByte ConnACKRC
ConnServerUnavailable           = Word8
0x88
  toByte ConnACKRC
ConnServerBusy                  = Word8
0x89
  toByte ConnACKRC
ConnBanned                      = Word8
0x8a
  toByte ConnACKRC
ConnBadAuthenticationMethod     = Word8
0x8c
  toByte ConnACKRC
ConnTopicNameInvalid            = Word8
0x90
  toByte ConnACKRC
ConnPacketTooLarge              = Word8
0x95
  toByte ConnACKRC
ConnQuotaExceeded               = Word8
0x97
  toByte ConnACKRC
ConnPayloadFormatInvalid        = Word8
0x99
  toByte ConnACKRC
ConnRetainNotSupported          = Word8
0x9a
  toByte ConnACKRC
ConnQosNotSupported             = Word8
0x9b
  toByte ConnACKRC
ConnUseAnotherServer            = Word8
0x9c
  toByte ConnACKRC
ConnServerMoved                 = Word8
0x9d
  toByte ConnACKRC
ConnConnectionRateExceeded      = Word8
0x9f
  fromByte :: Word8 -> ConnACKRC
fromByte Word8
b = ConnACKRC -> Maybe ConnACKRC -> ConnACKRC
forall a. a -> Maybe a -> a
fromMaybe ConnACKRC
ConnUnspecifiedError (Maybe ConnACKRC -> ConnACKRC) -> Maybe ConnACKRC -> ConnACKRC
forall a b. (a -> b) -> a -> b
$ Word8 -> [(Word8, ConnACKRC)] -> Maybe ConnACKRC
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Word8
b [(Word8, ConnACKRC)]
connACKRev
connACKRev :: [(Word8, ConnACKRC)]
connACKRev :: [(Word8, ConnACKRC)]
connACKRev = (ConnACKRC -> (Word8, ConnACKRC))
-> [ConnACKRC] -> [(Word8, ConnACKRC)]
forall a b. (a -> b) -> [a] -> [b]
map (\ConnACKRC
w -> (ConnACKRC -> Word8
forall a. ByteSize a => a -> Word8
toByte ConnACKRC
w, ConnACKRC
w)) [ConnACKRC
forall a. Bounded a => a
minBound..]
data SessionReuse = NewSession | ExistingSession deriving (Int -> SessionReuse -> ShowS
[SessionReuse] -> ShowS
SessionReuse -> String
(Int -> SessionReuse -> ShowS)
-> (SessionReuse -> String)
-> ([SessionReuse] -> ShowS)
-> Show SessionReuse
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SessionReuse] -> ShowS
$cshowList :: [SessionReuse] -> ShowS
show :: SessionReuse -> String
$cshow :: SessionReuse -> String
showsPrec :: Int -> SessionReuse -> ShowS
$cshowsPrec :: Int -> SessionReuse -> ShowS
Show, SessionReuse -> SessionReuse -> Bool
(SessionReuse -> SessionReuse -> Bool)
-> (SessionReuse -> SessionReuse -> Bool) -> Eq SessionReuse
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SessionReuse -> SessionReuse -> Bool
$c/= :: SessionReuse -> SessionReuse -> Bool
== :: SessionReuse -> SessionReuse -> Bool
$c== :: SessionReuse -> SessionReuse -> Bool
Eq, SessionReuse
SessionReuse -> SessionReuse -> Bounded SessionReuse
forall a. a -> a -> Bounded a
maxBound :: SessionReuse
$cmaxBound :: SessionReuse
minBound :: SessionReuse
$cminBound :: SessionReuse
Bounded, Int -> SessionReuse
SessionReuse -> Int
SessionReuse -> [SessionReuse]
SessionReuse -> SessionReuse
SessionReuse -> SessionReuse -> [SessionReuse]
SessionReuse -> SessionReuse -> SessionReuse -> [SessionReuse]
(SessionReuse -> SessionReuse)
-> (SessionReuse -> SessionReuse)
-> (Int -> SessionReuse)
-> (SessionReuse -> Int)
-> (SessionReuse -> [SessionReuse])
-> (SessionReuse -> SessionReuse -> [SessionReuse])
-> (SessionReuse -> SessionReuse -> [SessionReuse])
-> (SessionReuse -> SessionReuse -> SessionReuse -> [SessionReuse])
-> Enum SessionReuse
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: SessionReuse -> SessionReuse -> SessionReuse -> [SessionReuse]
$cenumFromThenTo :: SessionReuse -> SessionReuse -> SessionReuse -> [SessionReuse]
enumFromTo :: SessionReuse -> SessionReuse -> [SessionReuse]
$cenumFromTo :: SessionReuse -> SessionReuse -> [SessionReuse]
enumFromThen :: SessionReuse -> SessionReuse -> [SessionReuse]
$cenumFromThen :: SessionReuse -> SessionReuse -> [SessionReuse]
enumFrom :: SessionReuse -> [SessionReuse]
$cenumFrom :: SessionReuse -> [SessionReuse]
fromEnum :: SessionReuse -> Int
$cfromEnum :: SessionReuse -> Int
toEnum :: Int -> SessionReuse
$ctoEnum :: Int -> SessionReuse
pred :: SessionReuse -> SessionReuse
$cpred :: SessionReuse -> SessionReuse
succ :: SessionReuse -> SessionReuse
$csucc :: SessionReuse -> SessionReuse
Enum)
data ConnACKFlags = ConnACKFlags SessionReuse ConnACKRC [Property] deriving (ConnACKFlags -> ConnACKFlags -> Bool
(ConnACKFlags -> ConnACKFlags -> Bool)
-> (ConnACKFlags -> ConnACKFlags -> Bool) -> Eq ConnACKFlags
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ConnACKFlags -> ConnACKFlags -> Bool
$c/= :: ConnACKFlags -> ConnACKFlags -> Bool
== :: ConnACKFlags -> ConnACKFlags -> Bool
$c== :: ConnACKFlags -> ConnACKFlags -> Bool
Eq, Int -> ConnACKFlags -> ShowS
[ConnACKFlags] -> ShowS
ConnACKFlags -> String
(Int -> ConnACKFlags -> ShowS)
-> (ConnACKFlags -> String)
-> ([ConnACKFlags] -> ShowS)
-> Show ConnACKFlags
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ConnACKFlags] -> ShowS
$cshowList :: [ConnACKFlags] -> ShowS
show :: ConnACKFlags -> String
$cshow :: ConnACKFlags -> String
showsPrec :: Int -> ConnACKFlags -> ShowS
$cshowsPrec :: Int -> ConnACKFlags -> ShowS
Show)
instance ByteMe ConnACKFlags where
  toBytes :: ProtocolLevel -> ConnACKFlags -> [Word8]
toBytes ProtocolLevel
prot (ConnACKFlags SessionReuse
sp ConnACKRC
rc [Property]
props) =
    let pbytes :: [Word8]
pbytes = ByteString -> [Word8]
BL.unpack (ByteString -> [Word8]) -> ByteString -> [Word8]
forall a b. (a -> b) -> a -> b
$ ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props in
      [Word8
0x20]
      [Word8] -> [Word8] -> [Word8]
forall a. Semigroup a => a -> a -> a
<> Int -> [Word8]
encodeVarInt (Int
2 Int -> Int -> Int
forall a. Num a => a -> a -> a
+ [Word8] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [Word8]
pbytes)
      [Word8] -> [Word8] -> [Word8]
forall a. Semigroup a => a -> a -> a
<>[ Bool -> Word8
boolBit (SessionReuse
sp SessionReuse -> SessionReuse -> Bool
forall a. Eq a => a -> a -> Bool
/= SessionReuse
NewSession), ConnACKRC -> Word8
forall a. ByteSize a => a -> Word8
toByte ConnACKRC
rc] [Word8] -> [Word8] -> [Word8]
forall a. Semigroup a => a -> a -> a
<> [Word8]
pbytes
parseConnectACK :: A.Parser MQTTPkt
parseConnectACK :: Parser MQTTPkt
parseConnectACK = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x20
  Int
rl <- Parser Int
decodeVarInt 
  Bool -> Parser ByteString () -> Parser ByteString ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Int
rl Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
< Int
2) (Parser ByteString () -> Parser ByteString ())
-> Parser ByteString () -> Parser ByteString ()
forall a b. (a -> b) -> a -> b
$ String -> Parser ByteString ()
forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"conn ack packet too short"
  Word8
ackFlags <- Parser Word8
A.anyWord8
  Word8
rc <- Parser Word8
A.anyWord8
  [Property]
p <- ProtocolLevel -> Parser [Property]
parseProperties (if Int
rl Int -> Int -> Bool
forall a. Eq a => a -> a -> Bool
== Int
2 then ProtocolLevel
Protocol311 else ProtocolLevel
Protocol50)
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ ConnACKFlags -> MQTTPkt
ConnACKPkt (ConnACKFlags -> MQTTPkt) -> ConnACKFlags -> MQTTPkt
forall a b. (a -> b) -> a -> b
$ SessionReuse -> ConnACKRC -> [Property] -> ConnACKFlags
ConnACKFlags (Bool -> SessionReuse
sf (Bool -> SessionReuse) -> Bool -> SessionReuse
forall a b. (a -> b) -> a -> b
$ Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
ackFlags Int
0) (Word8 -> ConnACKRC
forall a. ByteSize a => Word8 -> a
fromByte Word8
rc) [Property]
p
    where sf :: Bool -> SessionReuse
sf Bool
False = SessionReuse
NewSession
          sf Bool
True  = SessionReuse
ExistingSession
type PktID = Word16
data PublishRequest = PublishRequest{
  PublishRequest -> Bool
_pubDup      :: Bool
  , PublishRequest -> QoS
_pubQoS    :: QoS
  , PublishRequest -> Bool
_pubRetain :: Bool
  , PublishRequest -> ByteString
_pubTopic  :: BL.ByteString
  , PublishRequest -> Word16
_pubPktID  :: PktID
  , PublishRequest -> ByteString
_pubBody   :: BL.ByteString
  , PublishRequest -> [Property]
_pubProps  :: [Property]
  } deriving(PublishRequest -> PublishRequest -> Bool
(PublishRequest -> PublishRequest -> Bool)
-> (PublishRequest -> PublishRequest -> Bool) -> Eq PublishRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PublishRequest -> PublishRequest -> Bool
$c/= :: PublishRequest -> PublishRequest -> Bool
== :: PublishRequest -> PublishRequest -> Bool
$c== :: PublishRequest -> PublishRequest -> Bool
Eq, Int -> PublishRequest -> ShowS
[PublishRequest] -> ShowS
PublishRequest -> String
(Int -> PublishRequest -> ShowS)
-> (PublishRequest -> String)
-> ([PublishRequest] -> ShowS)
-> Show PublishRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PublishRequest] -> ShowS
$cshowList :: [PublishRequest] -> ShowS
show :: PublishRequest -> String
$cshow :: PublishRequest -> String
showsPrec :: Int -> PublishRequest -> ShowS
$cshowsPrec :: Int -> PublishRequest -> ShowS
Show)
instance ByteMe PublishRequest where
  toByteString :: ProtocolLevel -> PublishRequest -> ByteString
toByteString ProtocolLevel
prot PublishRequest{Bool
[Property]
Word16
ByteString
QoS
_pubProps :: [Property]
_pubBody :: ByteString
_pubPktID :: Word16
_pubTopic :: ByteString
_pubRetain :: Bool
_pubQoS :: QoS
_pubDup :: Bool
_pubProps :: PublishRequest -> [Property]
_pubBody :: PublishRequest -> ByteString
_pubPktID :: PublishRequest -> Word16
_pubTopic :: PublishRequest -> ByteString
_pubRetain :: PublishRequest -> Bool
_pubQoS :: PublishRequest -> QoS
_pubDup :: PublishRequest -> Bool
..} =
    Word8 -> ByteString
BL.singleton (Word8
0x30 Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
f) ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength ByteString
val
    where f :: Word8
f = (Word8
db Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
3) Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. (Word8
qb Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≪ Int
1) Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
rb
          db :: Word8
db = Bool -> Word8
boolBit Bool
_pubDup
          qb :: Word8
qb = QoS -> Word8
qosW QoS
_pubQoS Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0x3
          rb :: Word8
rb = Bool -> Word8
boolBit Bool
_pubRetain
          pktid :: ByteString
pktid
            | QoS
_pubQoS QoS -> QoS -> Bool
forall a. Eq a => a -> a -> Bool
== QoS
QoS0 = ByteString
forall a. Monoid a => a
mempty
            | Bool
otherwise = Word16 -> ByteString
encodeWord16 Word16
_pubPktID
          val :: ByteString
val = ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
_pubTopic ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
pktid ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
_pubProps ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
_pubBody
parsePublish :: ProtocolLevel -> A.Parser MQTTPkt
parsePublish :: ProtocolLevel -> Parser MQTTPkt
parsePublish ProtocolLevel
prot = do
  Word8
w <- (Word8 -> Bool) -> Parser Word8
A.satisfy (\Word8
x -> Word8
x Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0xf0 Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
== Word8
0x30)
  Int
plen <- Parser Int
parseHdrLen
  let _pubDup :: Bool
_pubDup = Word8
w Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0x8 Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
== Word8
0x8
      _pubQoS :: QoS
_pubQoS = Word8 -> QoS
wQos (Word8 -> QoS) -> Word8 -> QoS
forall a b. (a -> b) -> a -> b
$ (Word8
w Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≫ Int
1) Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
3
      _pubRetain :: Bool
_pubRetain = Word8
w Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
1 Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
== Word8
1
  ByteString
_pubTopic <- Parser ByteString ByteString
aString
  Word16
_pubPktID <- if QoS
_pubQoS QoS -> QoS -> Bool
forall a. Eq a => a -> a -> Bool
== QoS
QoS0 then Word16 -> Parser ByteString Word16
forall (f :: * -> *) a. Applicative f => a -> f a
pure Word16
0 else Parser ByteString Word16
aWord16
  [Property]
_pubProps <- ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
prot
  ByteString
_pubBody <- ByteString -> ByteString
BL.fromStrict (ByteString -> ByteString)
-> Parser ByteString ByteString -> Parser ByteString ByteString
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Int -> Parser ByteString ByteString
A.take (Int
plen Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int64 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral (ByteString -> Int64
BL.length ByteString
_pubTopic) Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
2
                                        Int -> Int -> Int
forall a. Num a => a -> a -> a
- QoS -> Int
forall p. Num p => QoS -> p
qlen QoS
_pubQoS Int -> Int -> Int
forall a. Num a => a -> a -> a
- ProtocolLevel -> [Property] -> Int
propLen ProtocolLevel
prot [Property]
_pubProps )
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ PublishRequest -> MQTTPkt
PublishPkt PublishRequest :: Bool
-> QoS
-> Bool
-> ByteString
-> Word16
-> ByteString
-> [Property]
-> PublishRequest
PublishRequest{Bool
[Property]
Word16
ByteString
QoS
_pubBody :: ByteString
_pubProps :: [Property]
_pubPktID :: Word16
_pubTopic :: ByteString
_pubRetain :: Bool
_pubQoS :: QoS
_pubDup :: Bool
_pubProps :: [Property]
_pubBody :: ByteString
_pubPktID :: Word16
_pubTopic :: ByteString
_pubRetain :: Bool
_pubQoS :: QoS
_pubDup :: Bool
..}
  where qlen :: QoS -> p
qlen QoS
QoS0 = p
0
        qlen QoS
_    = p
2
data RetainHandling = SendOnSubscribe       
                    | SendOnSubscribeNew    
                    | DoNotSendOnSubscribe  
  deriving (RetainHandling -> RetainHandling -> Bool
(RetainHandling -> RetainHandling -> Bool)
-> (RetainHandling -> RetainHandling -> Bool) -> Eq RetainHandling
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RetainHandling -> RetainHandling -> Bool
$c/= :: RetainHandling -> RetainHandling -> Bool
== :: RetainHandling -> RetainHandling -> Bool
$c== :: RetainHandling -> RetainHandling -> Bool
Eq, Int -> RetainHandling -> ShowS
[RetainHandling] -> ShowS
RetainHandling -> String
(Int -> RetainHandling -> ShowS)
-> (RetainHandling -> String)
-> ([RetainHandling] -> ShowS)
-> Show RetainHandling
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [RetainHandling] -> ShowS
$cshowList :: [RetainHandling] -> ShowS
show :: RetainHandling -> String
$cshow :: RetainHandling -> String
showsPrec :: Int -> RetainHandling -> ShowS
$cshowsPrec :: Int -> RetainHandling -> ShowS
Show, RetainHandling
RetainHandling -> RetainHandling -> Bounded RetainHandling
forall a. a -> a -> Bounded a
maxBound :: RetainHandling
$cmaxBound :: RetainHandling
minBound :: RetainHandling
$cminBound :: RetainHandling
Bounded, Int -> RetainHandling
RetainHandling -> Int
RetainHandling -> [RetainHandling]
RetainHandling -> RetainHandling
RetainHandling -> RetainHandling -> [RetainHandling]
RetainHandling
-> RetainHandling -> RetainHandling -> [RetainHandling]
(RetainHandling -> RetainHandling)
-> (RetainHandling -> RetainHandling)
-> (Int -> RetainHandling)
-> (RetainHandling -> Int)
-> (RetainHandling -> [RetainHandling])
-> (RetainHandling -> RetainHandling -> [RetainHandling])
-> (RetainHandling -> RetainHandling -> [RetainHandling])
-> (RetainHandling
    -> RetainHandling -> RetainHandling -> [RetainHandling])
-> Enum RetainHandling
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: RetainHandling
-> RetainHandling -> RetainHandling -> [RetainHandling]
$cenumFromThenTo :: RetainHandling
-> RetainHandling -> RetainHandling -> [RetainHandling]
enumFromTo :: RetainHandling -> RetainHandling -> [RetainHandling]
$cenumFromTo :: RetainHandling -> RetainHandling -> [RetainHandling]
enumFromThen :: RetainHandling -> RetainHandling -> [RetainHandling]
$cenumFromThen :: RetainHandling -> RetainHandling -> [RetainHandling]
enumFrom :: RetainHandling -> [RetainHandling]
$cenumFrom :: RetainHandling -> [RetainHandling]
fromEnum :: RetainHandling -> Int
$cfromEnum :: RetainHandling -> Int
toEnum :: Int -> RetainHandling
$ctoEnum :: Int -> RetainHandling
pred :: RetainHandling -> RetainHandling
$cpred :: RetainHandling -> RetainHandling
succ :: RetainHandling -> RetainHandling
$csucc :: RetainHandling -> RetainHandling
Enum)
data SubOptions = SubOptions{
  SubOptions -> RetainHandling
_retainHandling      :: RetainHandling  
  , SubOptions -> Bool
_retainAsPublished :: Bool            
  , SubOptions -> Bool
_noLocal           :: Bool            
  , SubOptions -> QoS
_subQoS            :: QoS             
  } deriving(SubOptions -> SubOptions -> Bool
(SubOptions -> SubOptions -> Bool)
-> (SubOptions -> SubOptions -> Bool) -> Eq SubOptions
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubOptions -> SubOptions -> Bool
$c/= :: SubOptions -> SubOptions -> Bool
== :: SubOptions -> SubOptions -> Bool
$c== :: SubOptions -> SubOptions -> Bool
Eq, Int -> SubOptions -> ShowS
[SubOptions] -> ShowS
SubOptions -> String
(Int -> SubOptions -> ShowS)
-> (SubOptions -> String)
-> ([SubOptions] -> ShowS)
-> Show SubOptions
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubOptions] -> ShowS
$cshowList :: [SubOptions] -> ShowS
show :: SubOptions -> String
$cshow :: SubOptions -> String
showsPrec :: Int -> SubOptions -> ShowS
$cshowsPrec :: Int -> SubOptions -> ShowS
Show)
subOptions :: SubOptions
subOptions :: SubOptions
subOptions = SubOptions :: RetainHandling -> Bool -> Bool -> QoS -> SubOptions
SubOptions{_retainHandling :: RetainHandling
_retainHandling=RetainHandling
SendOnSubscribe,
                         _retainAsPublished :: Bool
_retainAsPublished=Bool
False,
                         _noLocal :: Bool
_noLocal=Bool
False,
                         _subQoS :: QoS
_subQoS=QoS
QoS0}
instance ByteMe SubOptions where
  toByteString :: ProtocolLevel -> SubOptions -> ByteString
toByteString ProtocolLevel
_ SubOptions{Bool
RetainHandling
QoS
_subQoS :: QoS
_noLocal :: Bool
_retainAsPublished :: Bool
_retainHandling :: RetainHandling
_subQoS :: SubOptions -> QoS
_noLocal :: SubOptions -> Bool
_retainAsPublished :: SubOptions -> Bool
_retainHandling :: SubOptions -> RetainHandling
..} = Word8 -> ByteString
BL.singleton (Word8
rh Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
rap Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
nl Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.|. Word8
q)
    where
      rh :: Word8
rh = case RetainHandling
_retainHandling of
             RetainHandling
SendOnSubscribeNew   -> Word8
0x10
             RetainHandling
DoNotSendOnSubscribe -> Word8
0x20
             RetainHandling
_                    -> Word8
0
      rap :: Word8
rap
        | Bool
_retainAsPublished = Word8
0x08
        | Bool
otherwise = Word8
0
      nl :: Word8
nl
        | Bool
_noLocal = Word8
0x04
        | Bool
otherwise = Word8
0
      q :: Word8
q = QoS -> Word8
qosW QoS
_subQoS
parseSubOptions :: A.Parser SubOptions
parseSubOptions :: Parser SubOptions
parseSubOptions = do
  Word8
w <- Parser Word8
A.anyWord8
  let rh :: RetainHandling
rh = case Word8
w Word8 -> Int -> Word8
forall a. Bits a => a -> Int -> a
≫ Int
4 of
             Word8
1 -> RetainHandling
SendOnSubscribeNew
             Word8
2 -> RetainHandling
DoNotSendOnSubscribe
             Word8
_ -> RetainHandling
SendOnSubscribe
  SubOptions -> Parser SubOptions
forall (f :: * -> *) a. Applicative f => a -> f a
pure (SubOptions -> Parser SubOptions)
-> SubOptions -> Parser SubOptions
forall a b. (a -> b) -> a -> b
$ SubOptions :: RetainHandling -> Bool -> Bool -> QoS -> SubOptions
SubOptions{
    _retainHandling :: RetainHandling
_retainHandling=RetainHandling
rh,
    _retainAsPublished :: Bool
_retainAsPublished=Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
w Int
3,
    _noLocal :: Bool
_noLocal=Word8 -> Int -> Bool
forall a. Bits a => a -> Int -> Bool
testBit Word8
w Int
2,
    _subQoS :: QoS
_subQoS=Word8 -> QoS
wQos (Word8
w Word8 -> Word8 -> Word8
forall a. Bits a => a -> a -> a
.&. Word8
0x3)}
subOptionsBytes :: ProtocolLevel -> [(BL.ByteString, SubOptions)] -> BL.ByteString
subOptionsBytes :: ProtocolLevel -> [(ByteString, SubOptions)] -> ByteString
subOptionsBytes ProtocolLevel
prot = ((ByteString, SubOptions) -> ByteString)
-> [(ByteString, SubOptions)] -> ByteString
forall (t :: * -> *) m a.
(Foldable t, Monoid m) =>
(a -> m) -> t a -> m
foldMap (\(ByteString
bs,SubOptions
so) -> ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot ByteString
bs ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> SubOptions -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot SubOptions
so)
data SubscribeRequest = SubscribeRequest PktID [(BL.ByteString, SubOptions)] [Property]
                      deriving(SubscribeRequest -> SubscribeRequest -> Bool
(SubscribeRequest -> SubscribeRequest -> Bool)
-> (SubscribeRequest -> SubscribeRequest -> Bool)
-> Eq SubscribeRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubscribeRequest -> SubscribeRequest -> Bool
$c/= :: SubscribeRequest -> SubscribeRequest -> Bool
== :: SubscribeRequest -> SubscribeRequest -> Bool
$c== :: SubscribeRequest -> SubscribeRequest -> Bool
Eq, Int -> SubscribeRequest -> ShowS
[SubscribeRequest] -> ShowS
SubscribeRequest -> String
(Int -> SubscribeRequest -> ShowS)
-> (SubscribeRequest -> String)
-> ([SubscribeRequest] -> ShowS)
-> Show SubscribeRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubscribeRequest] -> ShowS
$cshowList :: [SubscribeRequest] -> ShowS
show :: SubscribeRequest -> String
$cshow :: SubscribeRequest -> String
showsPrec :: Int -> SubscribeRequest -> ShowS
$cshowsPrec :: Int -> SubscribeRequest -> ShowS
Show)
instance ByteMe SubscribeRequest where
  toByteString :: ProtocolLevel -> SubscribeRequest -> ByteString
toByteString ProtocolLevel
prot (SubscribeRequest Word16
pid [(ByteString, SubOptions)]
sreq [Property]
props) =
    Word8 -> ByteString
BL.singleton Word8
0x82 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [(ByteString, SubOptions)] -> ByteString
subOptionsBytes ProtocolLevel
prot [(ByteString, SubOptions)]
sreq)
data PubACK = PubACK PktID Word8 [Property] deriving(PubACK -> PubACK -> Bool
(PubACK -> PubACK -> Bool)
-> (PubACK -> PubACK -> Bool) -> Eq PubACK
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PubACK -> PubACK -> Bool
$c/= :: PubACK -> PubACK -> Bool
== :: PubACK -> PubACK -> Bool
$c== :: PubACK -> PubACK -> Bool
Eq, Int -> PubACK -> ShowS
[PubACK] -> ShowS
PubACK -> String
(Int -> PubACK -> ShowS)
-> (PubACK -> String) -> ([PubACK] -> ShowS) -> Show PubACK
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PubACK] -> ShowS
$cshowList :: [PubACK] -> ShowS
show :: PubACK -> String
$cshow :: PubACK -> String
showsPrec :: Int -> PubACK -> ShowS
$cshowsPrec :: Int -> PubACK -> ShowS
Show)
bsPubSeg :: ProtocolLevel -> Word8 -> Word16 -> Word8 -> [Property] -> BL.ByteString
bsPubSeg :: ProtocolLevel
-> Word8 -> Word16 -> Word8 -> [Property] -> ByteString
bsPubSeg ProtocolLevel
Protocol311 Word8
h Word16
pid Word8
_ [Property]
_ = Word8 -> ByteString
BL.singleton Word8
h ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid)
bsPubSeg ProtocolLevel
Protocol50 Word8
h Word16
pid Word8
st [Property]
props = Word8 -> ByteString
BL.singleton Word8
h
                                     ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid
                                                    ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> Word8 -> ByteString
BL.singleton Word8
st
                                                    ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> [Property] -> ByteString
mprop [Property]
props)
    where
      mprop :: [Property] -> ByteString
mprop [] = ByteString
forall a. Monoid a => a
mempty
      mprop [Property]
p  = ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
Protocol50 [Property]
p
instance ByteMe PubACK where
  toByteString :: ProtocolLevel -> PubACK -> ByteString
toByteString ProtocolLevel
prot (PubACK Word16
pid Word8
st [Property]
props) = ProtocolLevel
-> Word8 -> Word16 -> Word8 -> [Property] -> ByteString
bsPubSeg ProtocolLevel
prot Word8
0x40 Word16
pid Word8
st [Property]
props
parsePubSeg :: A.Parser (PktID, Word8, [Property])
parsePubSeg :: Parser (Word16, Word8, [Property])
parsePubSeg = do
  Int
rl <- Parser Int
parseHdrLen
  Word16
mid <- Parser ByteString Word16
aWord16
  Word8
st <- if Int
rl Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
2 then Parser Word8
A.anyWord8 else Word8 -> Parser Word8
forall (f :: * -> *) a. Applicative f => a -> f a
pure Word8
0
  [Property]
props <- if Int
rl Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
4 then ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
Protocol50 else [Property] -> Parser [Property]
forall (f :: * -> *) a. Applicative f => a -> f a
pure [Property]
forall a. Monoid a => a
mempty
  (Word16, Word8, [Property]) -> Parser (Word16, Word8, [Property])
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Word16
mid, Word8
st, [Property]
props)
parsePubACK :: A.Parser MQTTPkt
parsePubACK :: Parser MQTTPkt
parsePubACK = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x40
  (Word16
mid, Word8
st, [Property]
props) <- Parser (Word16, Word8, [Property])
parsePubSeg
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ PubACK -> MQTTPkt
PubACKPkt (Word16 -> Word8 -> [Property] -> PubACK
PubACK Word16
mid Word8
st [Property]
props)
data PubREC = PubREC PktID Word8 [Property] deriving(PubREC -> PubREC -> Bool
(PubREC -> PubREC -> Bool)
-> (PubREC -> PubREC -> Bool) -> Eq PubREC
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PubREC -> PubREC -> Bool
$c/= :: PubREC -> PubREC -> Bool
== :: PubREC -> PubREC -> Bool
$c== :: PubREC -> PubREC -> Bool
Eq, Int -> PubREC -> ShowS
[PubREC] -> ShowS
PubREC -> String
(Int -> PubREC -> ShowS)
-> (PubREC -> String) -> ([PubREC] -> ShowS) -> Show PubREC
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PubREC] -> ShowS
$cshowList :: [PubREC] -> ShowS
show :: PubREC -> String
$cshow :: PubREC -> String
showsPrec :: Int -> PubREC -> ShowS
$cshowsPrec :: Int -> PubREC -> ShowS
Show)
instance ByteMe PubREC where
  toByteString :: ProtocolLevel -> PubREC -> ByteString
toByteString ProtocolLevel
prot (PubREC Word16
pid Word8
st [Property]
props) = ProtocolLevel
-> Word8 -> Word16 -> Word8 -> [Property] -> ByteString
bsPubSeg ProtocolLevel
prot Word8
0x50 Word16
pid Word8
st [Property]
props
parsePubREC :: A.Parser MQTTPkt
parsePubREC :: Parser MQTTPkt
parsePubREC = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x50
  (Word16
mid, Word8
st, [Property]
props) <- Parser (Word16, Word8, [Property])
parsePubSeg
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ PubREC -> MQTTPkt
PubRECPkt (Word16 -> Word8 -> [Property] -> PubREC
PubREC Word16
mid Word8
st [Property]
props)
data PubREL = PubREL PktID Word8 [Property] deriving(PubREL -> PubREL -> Bool
(PubREL -> PubREL -> Bool)
-> (PubREL -> PubREL -> Bool) -> Eq PubREL
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PubREL -> PubREL -> Bool
$c/= :: PubREL -> PubREL -> Bool
== :: PubREL -> PubREL -> Bool
$c== :: PubREL -> PubREL -> Bool
Eq, Int -> PubREL -> ShowS
[PubREL] -> ShowS
PubREL -> String
(Int -> PubREL -> ShowS)
-> (PubREL -> String) -> ([PubREL] -> ShowS) -> Show PubREL
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PubREL] -> ShowS
$cshowList :: [PubREL] -> ShowS
show :: PubREL -> String
$cshow :: PubREL -> String
showsPrec :: Int -> PubREL -> ShowS
$cshowsPrec :: Int -> PubREL -> ShowS
Show)
instance ByteMe PubREL where
  toByteString :: ProtocolLevel -> PubREL -> ByteString
toByteString ProtocolLevel
prot (PubREL Word16
pid Word8
st [Property]
props) = ProtocolLevel
-> Word8 -> Word16 -> Word8 -> [Property] -> ByteString
bsPubSeg ProtocolLevel
prot Word8
0x62 Word16
pid Word8
st [Property]
props
parsePubREL :: A.Parser MQTTPkt
parsePubREL :: Parser MQTTPkt
parsePubREL = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x62
  (Word16
mid, Word8
st, [Property]
props) <- Parser (Word16, Word8, [Property])
parsePubSeg
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ PubREL -> MQTTPkt
PubRELPkt (Word16 -> Word8 -> [Property] -> PubREL
PubREL Word16
mid Word8
st [Property]
props)
data PubCOMP = PubCOMP PktID Word8 [Property] deriving(PubCOMP -> PubCOMP -> Bool
(PubCOMP -> PubCOMP -> Bool)
-> (PubCOMP -> PubCOMP -> Bool) -> Eq PubCOMP
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PubCOMP -> PubCOMP -> Bool
$c/= :: PubCOMP -> PubCOMP -> Bool
== :: PubCOMP -> PubCOMP -> Bool
$c== :: PubCOMP -> PubCOMP -> Bool
Eq, Int -> PubCOMP -> ShowS
[PubCOMP] -> ShowS
PubCOMP -> String
(Int -> PubCOMP -> ShowS)
-> (PubCOMP -> String) -> ([PubCOMP] -> ShowS) -> Show PubCOMP
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PubCOMP] -> ShowS
$cshowList :: [PubCOMP] -> ShowS
show :: PubCOMP -> String
$cshow :: PubCOMP -> String
showsPrec :: Int -> PubCOMP -> ShowS
$cshowsPrec :: Int -> PubCOMP -> ShowS
Show)
instance ByteMe PubCOMP where
  toByteString :: ProtocolLevel -> PubCOMP -> ByteString
toByteString ProtocolLevel
prot (PubCOMP Word16
pid Word8
st [Property]
props) = ProtocolLevel
-> Word8 -> Word16 -> Word8 -> [Property] -> ByteString
bsPubSeg ProtocolLevel
prot Word8
0x70 Word16
pid Word8
st [Property]
props
parsePubCOMP :: A.Parser MQTTPkt
parsePubCOMP :: Parser MQTTPkt
parsePubCOMP = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0x70
  (Word16
mid, Word8
st, [Property]
props) <- Parser (Word16, Word8, [Property])
parsePubSeg
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ PubCOMP -> MQTTPkt
PubCOMPPkt (Word16 -> Word8 -> [Property] -> PubCOMP
PubCOMP Word16
mid Word8
st [Property]
props)
parseSubHdr :: Word8 -> ProtocolLevel -> A.Parser a -> A.Parser (PktID, [Property], a)
parseSubHdr :: Word8
-> ProtocolLevel -> Parser a -> Parser (Word16, [Property], a)
parseSubHdr Word8
b ProtocolLevel
prot Parser a
p = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
b
  Int
hl <- Parser Int
parseHdrLen
  Word16
pid <- Parser ByteString Word16
aWord16
  [Property]
props <- ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
prot
  ByteString
content <- Int -> Parser ByteString ByteString
A.take (Int -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int
hl Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
2 Int -> Int -> Int
forall a. Num a => a -> a -> a
- ProtocolLevel -> [Property] -> Int
propLen ProtocolLevel
prot [Property]
props)
  a
a <- ByteString -> Parser a
subp ByteString
content
  (Word16, [Property], a) -> Parser (Word16, [Property], a)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Word16
pid, [Property]
props, a
a)
    where subp :: ByteString -> Parser a
subp = (String -> Parser a)
-> (a -> Parser a) -> Either String a -> Parser a
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either String -> Parser a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail a -> Parser a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Either String a -> Parser a)
-> (ByteString -> Either String a) -> ByteString -> Parser a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Parser a -> ByteString -> Either String a
forall a. Parser a -> ByteString -> Either String a
A.parseOnly Parser a
p
parseSubscribe :: ProtocolLevel -> A.Parser MQTTPkt
parseSubscribe :: ProtocolLevel -> Parser MQTTPkt
parseSubscribe ProtocolLevel
prot = do
  (Word16
pid, [Property]
props, [(ByteString, SubOptions)]
subs) <- Word8
-> ProtocolLevel
-> Parser [(ByteString, SubOptions)]
-> Parser (Word16, [Property], [(ByteString, SubOptions)])
forall a.
Word8
-> ProtocolLevel -> Parser a -> Parser (Word16, [Property], a)
parseSubHdr Word8
0x82 ProtocolLevel
prot (Parser [(ByteString, SubOptions)]
 -> Parser (Word16, [Property], [(ByteString, SubOptions)]))
-> Parser [(ByteString, SubOptions)]
-> Parser (Word16, [Property], [(ByteString, SubOptions)])
forall a b. (a -> b) -> a -> b
$ Parser ByteString (ByteString, SubOptions)
-> Parser [(ByteString, SubOptions)]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
A.many1 ((ByteString -> SubOptions -> (ByteString, SubOptions))
-> Parser ByteString ByteString
-> Parser SubOptions
-> Parser ByteString (ByteString, SubOptions)
forall (f :: * -> *) a b c.
Applicative f =>
(a -> b -> c) -> f a -> f b -> f c
liftA2 (,) Parser ByteString ByteString
aString Parser SubOptions
parseSubOptions)
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ SubscribeRequest -> MQTTPkt
SubscribePkt (Word16
-> [(ByteString, SubOptions)] -> [Property] -> SubscribeRequest
SubscribeRequest Word16
pid [(ByteString, SubOptions)]
subs [Property]
props)
data SubscribeResponse = SubscribeResponse PktID [Either SubErr QoS] [Property] deriving (SubscribeResponse -> SubscribeResponse -> Bool
(SubscribeResponse -> SubscribeResponse -> Bool)
-> (SubscribeResponse -> SubscribeResponse -> Bool)
-> Eq SubscribeResponse
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubscribeResponse -> SubscribeResponse -> Bool
$c/= :: SubscribeResponse -> SubscribeResponse -> Bool
== :: SubscribeResponse -> SubscribeResponse -> Bool
$c== :: SubscribeResponse -> SubscribeResponse -> Bool
Eq, Int -> SubscribeResponse -> ShowS
[SubscribeResponse] -> ShowS
SubscribeResponse -> String
(Int -> SubscribeResponse -> ShowS)
-> (SubscribeResponse -> String)
-> ([SubscribeResponse] -> ShowS)
-> Show SubscribeResponse
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubscribeResponse] -> ShowS
$cshowList :: [SubscribeResponse] -> ShowS
show :: SubscribeResponse -> String
$cshow :: SubscribeResponse -> String
showsPrec :: Int -> SubscribeResponse -> ShowS
$cshowsPrec :: Int -> SubscribeResponse -> ShowS
Show)
instance ByteMe SubscribeResponse where
  toByteString :: ProtocolLevel -> SubscribeResponse -> ByteString
toByteString ProtocolLevel
prot (SubscribeResponse Word16
pid [Either SubErr QoS]
sres [Property]
props) =
    Word8 -> ByteString
BL.singleton Word8
0x90 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> [Word8] -> ByteString
BL.pack (Either SubErr QoS -> Word8
b (Either SubErr QoS -> Word8) -> [Either SubErr QoS] -> [Word8]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [Either SubErr QoS]
sres))
    where
      b :: Either SubErr QoS -> Word8
b (Left SubErr
SubErrUnspecifiedError)                    =  Word8
0x80
      b (Left SubErr
SubErrImplementationSpecificError)         =  Word8
0x83
      b (Left SubErr
SubErrNotAuthorized)                       =  Word8
0x87
      b (Left SubErr
SubErrTopicFilterInvalid)                  =  Word8
0x8F
      b (Left SubErr
SubErrPacketIdentifierInUse)               =  Word8
0x91
      b (Left SubErr
SubErrQuotaExceeded)                       =  Word8
0x97
      b (Left SubErr
SubErrSharedSubscriptionsNotSupported)     =  Word8
0x9E
      b (Left SubErr
SubErrSubscriptionIdentifiersNotSupported) =  Word8
0xA1
      b (Left SubErr
SubErrWildcardSubscriptionsNotSupported)   =  Word8
0xA2
      b (Right QoS
q)                                        = QoS -> Word8
qosW QoS
q
propLen :: ProtocolLevel -> [Property] -> Int
propLen :: ProtocolLevel -> [Property] -> Int
propLen ProtocolLevel
Protocol311 [Property]
_ = Int
0
propLen ProtocolLevel
prot [Property]
props    = Int64 -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int64 -> Int) -> Int64 -> Int
forall a b. (a -> b) -> a -> b
$ ByteString -> Int64
BL.length (ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props)
data SubErr = SubErrUnspecifiedError
  | SubErrImplementationSpecificError
  | SubErrNotAuthorized
  | SubErrTopicFilterInvalid
  | SubErrPacketIdentifierInUse
  | SubErrQuotaExceeded
  | SubErrSharedSubscriptionsNotSupported
  | SubErrSubscriptionIdentifiersNotSupported
  | SubErrWildcardSubscriptionsNotSupported
  deriving (SubErr -> SubErr -> Bool
(SubErr -> SubErr -> Bool)
-> (SubErr -> SubErr -> Bool) -> Eq SubErr
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SubErr -> SubErr -> Bool
$c/= :: SubErr -> SubErr -> Bool
== :: SubErr -> SubErr -> Bool
$c== :: SubErr -> SubErr -> Bool
Eq, Int -> SubErr -> ShowS
[SubErr] -> ShowS
SubErr -> String
(Int -> SubErr -> ShowS)
-> (SubErr -> String) -> ([SubErr] -> ShowS) -> Show SubErr
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubErr] -> ShowS
$cshowList :: [SubErr] -> ShowS
show :: SubErr -> String
$cshow :: SubErr -> String
showsPrec :: Int -> SubErr -> ShowS
$cshowsPrec :: Int -> SubErr -> ShowS
Show, SubErr
SubErr -> SubErr -> Bounded SubErr
forall a. a -> a -> Bounded a
maxBound :: SubErr
$cmaxBound :: SubErr
minBound :: SubErr
$cminBound :: SubErr
Bounded, Int -> SubErr
SubErr -> Int
SubErr -> [SubErr]
SubErr -> SubErr
SubErr -> SubErr -> [SubErr]
SubErr -> SubErr -> SubErr -> [SubErr]
(SubErr -> SubErr)
-> (SubErr -> SubErr)
-> (Int -> SubErr)
-> (SubErr -> Int)
-> (SubErr -> [SubErr])
-> (SubErr -> SubErr -> [SubErr])
-> (SubErr -> SubErr -> [SubErr])
-> (SubErr -> SubErr -> SubErr -> [SubErr])
-> Enum SubErr
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: SubErr -> SubErr -> SubErr -> [SubErr]
$cenumFromThenTo :: SubErr -> SubErr -> SubErr -> [SubErr]
enumFromTo :: SubErr -> SubErr -> [SubErr]
$cenumFromTo :: SubErr -> SubErr -> [SubErr]
enumFromThen :: SubErr -> SubErr -> [SubErr]
$cenumFromThen :: SubErr -> SubErr -> [SubErr]
enumFrom :: SubErr -> [SubErr]
$cenumFrom :: SubErr -> [SubErr]
fromEnum :: SubErr -> Int
$cfromEnum :: SubErr -> Int
toEnum :: Int -> SubErr
$ctoEnum :: Int -> SubErr
pred :: SubErr -> SubErr
$cpred :: SubErr -> SubErr
succ :: SubErr -> SubErr
$csucc :: SubErr -> SubErr
Enum)
parseSubACK :: ProtocolLevel -> A.Parser MQTTPkt
parseSubACK :: ProtocolLevel -> Parser MQTTPkt
parseSubACK ProtocolLevel
prot = do
  (Word16
pid, [Property]
props, [Either SubErr QoS]
res) <- Word8
-> ProtocolLevel
-> Parser [Either SubErr QoS]
-> Parser (Word16, [Property], [Either SubErr QoS])
forall a.
Word8
-> ProtocolLevel -> Parser a -> Parser (Word16, [Property], a)
parseSubHdr Word8
0x90 ProtocolLevel
prot (Parser [Either SubErr QoS]
 -> Parser (Word16, [Property], [Either SubErr QoS]))
-> Parser [Either SubErr QoS]
-> Parser (Word16, [Property], [Either SubErr QoS])
forall a b. (a -> b) -> a -> b
$ Parser ByteString (Either SubErr QoS) -> Parser [Either SubErr QoS]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
A.many1 (Word8 -> Either SubErr QoS
p (Word8 -> Either SubErr QoS)
-> Parser Word8 -> Parser ByteString (Either SubErr QoS)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8)
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ SubscribeResponse -> MQTTPkt
SubACKPkt (Word16 -> [Either SubErr QoS] -> [Property] -> SubscribeResponse
SubscribeResponse Word16
pid [Either SubErr QoS]
res [Property]
props)
  where
    p :: Word8 -> Either SubErr QoS
p Word8
0x80 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrUnspecifiedError
    p Word8
0x83 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrImplementationSpecificError
    p Word8
0x87 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrNotAuthorized
    p Word8
0x8F = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrTopicFilterInvalid
    p Word8
0x91 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrPacketIdentifierInUse
    p Word8
0x97 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrQuotaExceeded
    p Word8
0x9E = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrSharedSubscriptionsNotSupported
    p Word8
0xA1 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrSubscriptionIdentifiersNotSupported
    p Word8
0xA2 = SubErr -> Either SubErr QoS
forall a b. a -> Either a b
Left SubErr
SubErrWildcardSubscriptionsNotSupported
    p Word8
x    = QoS -> Either SubErr QoS
forall a b. b -> Either a b
Right (Word8 -> QoS
wQos Word8
x)
data UnsubscribeRequest = UnsubscribeRequest PktID [BL.ByteString] [Property]
                        deriving(UnsubscribeRequest -> UnsubscribeRequest -> Bool
(UnsubscribeRequest -> UnsubscribeRequest -> Bool)
-> (UnsubscribeRequest -> UnsubscribeRequest -> Bool)
-> Eq UnsubscribeRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UnsubscribeRequest -> UnsubscribeRequest -> Bool
$c/= :: UnsubscribeRequest -> UnsubscribeRequest -> Bool
== :: UnsubscribeRequest -> UnsubscribeRequest -> Bool
$c== :: UnsubscribeRequest -> UnsubscribeRequest -> Bool
Eq, Int -> UnsubscribeRequest -> ShowS
[UnsubscribeRequest] -> ShowS
UnsubscribeRequest -> String
(Int -> UnsubscribeRequest -> ShowS)
-> (UnsubscribeRequest -> String)
-> ([UnsubscribeRequest] -> ShowS)
-> Show UnsubscribeRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UnsubscribeRequest] -> ShowS
$cshowList :: [UnsubscribeRequest] -> ShowS
show :: UnsubscribeRequest -> String
$cshow :: UnsubscribeRequest -> String
showsPrec :: Int -> UnsubscribeRequest -> ShowS
$cshowsPrec :: Int -> UnsubscribeRequest -> ShowS
Show)
instance ByteMe UnsubscribeRequest where
  toByteString :: ProtocolLevel -> UnsubscribeRequest -> ByteString
toByteString ProtocolLevel
prot (UnsubscribeRequest Word16
pid [ByteString]
sreq [Property]
props) =
    Word8 -> ByteString
BL.singleton Word8
0xa2
    ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> [ByteString] -> ByteString
forall a. Monoid a => [a] -> a
mconcat (ProtocolLevel -> ByteString -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
prot (ByteString -> ByteString) -> [ByteString] -> [ByteString]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [ByteString]
sreq))
parseUnsubscribe :: ProtocolLevel -> A.Parser MQTTPkt
parseUnsubscribe :: ProtocolLevel -> Parser MQTTPkt
parseUnsubscribe ProtocolLevel
prot = do
  (Word16
pid, [Property]
props, [ByteString]
subs) <- Word8
-> ProtocolLevel
-> Parser [ByteString]
-> Parser (Word16, [Property], [ByteString])
forall a.
Word8
-> ProtocolLevel -> Parser a -> Parser (Word16, [Property], a)
parseSubHdr Word8
0xa2 ProtocolLevel
prot (Parser [ByteString] -> Parser (Word16, [Property], [ByteString]))
-> Parser [ByteString] -> Parser (Word16, [Property], [ByteString])
forall a b. (a -> b) -> a -> b
$ Parser ByteString ByteString -> Parser [ByteString]
forall (f :: * -> *) a. Alternative f => f a -> f [a]
A.many1 Parser ByteString ByteString
aString
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ UnsubscribeRequest -> MQTTPkt
UnsubscribePkt (Word16 -> [ByteString] -> [Property] -> UnsubscribeRequest
UnsubscribeRequest Word16
pid [ByteString]
subs [Property]
props)
data UnsubStatus = UnsubSuccess
                 | UnsubNoSubscriptionExisted
                 | UnsubUnspecifiedError
                 | UnsubImplementationSpecificError
                 | UnsubNotAuthorized
                 | UnsubTopicFilterInvalid
                 | UnsubPacketIdentifierInUse
                 deriving(Int -> UnsubStatus -> ShowS
[UnsubStatus] -> ShowS
UnsubStatus -> String
(Int -> UnsubStatus -> ShowS)
-> (UnsubStatus -> String)
-> ([UnsubStatus] -> ShowS)
-> Show UnsubStatus
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UnsubStatus] -> ShowS
$cshowList :: [UnsubStatus] -> ShowS
show :: UnsubStatus -> String
$cshow :: UnsubStatus -> String
showsPrec :: Int -> UnsubStatus -> ShowS
$cshowsPrec :: Int -> UnsubStatus -> ShowS
Show, UnsubStatus -> UnsubStatus -> Bool
(UnsubStatus -> UnsubStatus -> Bool)
-> (UnsubStatus -> UnsubStatus -> Bool) -> Eq UnsubStatus
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UnsubStatus -> UnsubStatus -> Bool
$c/= :: UnsubStatus -> UnsubStatus -> Bool
== :: UnsubStatus -> UnsubStatus -> Bool
$c== :: UnsubStatus -> UnsubStatus -> Bool
Eq, UnsubStatus
UnsubStatus -> UnsubStatus -> Bounded UnsubStatus
forall a. a -> a -> Bounded a
maxBound :: UnsubStatus
$cmaxBound :: UnsubStatus
minBound :: UnsubStatus
$cminBound :: UnsubStatus
Bounded, Int -> UnsubStatus
UnsubStatus -> Int
UnsubStatus -> [UnsubStatus]
UnsubStatus -> UnsubStatus
UnsubStatus -> UnsubStatus -> [UnsubStatus]
UnsubStatus -> UnsubStatus -> UnsubStatus -> [UnsubStatus]
(UnsubStatus -> UnsubStatus)
-> (UnsubStatus -> UnsubStatus)
-> (Int -> UnsubStatus)
-> (UnsubStatus -> Int)
-> (UnsubStatus -> [UnsubStatus])
-> (UnsubStatus -> UnsubStatus -> [UnsubStatus])
-> (UnsubStatus -> UnsubStatus -> [UnsubStatus])
-> (UnsubStatus -> UnsubStatus -> UnsubStatus -> [UnsubStatus])
-> Enum UnsubStatus
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: UnsubStatus -> UnsubStatus -> UnsubStatus -> [UnsubStatus]
$cenumFromThenTo :: UnsubStatus -> UnsubStatus -> UnsubStatus -> [UnsubStatus]
enumFromTo :: UnsubStatus -> UnsubStatus -> [UnsubStatus]
$cenumFromTo :: UnsubStatus -> UnsubStatus -> [UnsubStatus]
enumFromThen :: UnsubStatus -> UnsubStatus -> [UnsubStatus]
$cenumFromThen :: UnsubStatus -> UnsubStatus -> [UnsubStatus]
enumFrom :: UnsubStatus -> [UnsubStatus]
$cenumFrom :: UnsubStatus -> [UnsubStatus]
fromEnum :: UnsubStatus -> Int
$cfromEnum :: UnsubStatus -> Int
toEnum :: Int -> UnsubStatus
$ctoEnum :: Int -> UnsubStatus
pred :: UnsubStatus -> UnsubStatus
$cpred :: UnsubStatus -> UnsubStatus
succ :: UnsubStatus -> UnsubStatus
$csucc :: UnsubStatus -> UnsubStatus
Enum)
instance ByteMe UnsubStatus where
  toByteString :: ProtocolLevel -> UnsubStatus -> ByteString
toByteString ProtocolLevel
_ UnsubStatus
UnsubSuccess                     = Word8 -> ByteString
BL.singleton Word8
0x00
  toByteString ProtocolLevel
_ UnsubStatus
UnsubNoSubscriptionExisted       = Word8 -> ByteString
BL.singleton Word8
0x11
  toByteString ProtocolLevel
_ UnsubStatus
UnsubUnspecifiedError            = Word8 -> ByteString
BL.singleton Word8
0x80
  toByteString ProtocolLevel
_ UnsubStatus
UnsubImplementationSpecificError = Word8 -> ByteString
BL.singleton Word8
0x83
  toByteString ProtocolLevel
_ UnsubStatus
UnsubNotAuthorized               = Word8 -> ByteString
BL.singleton Word8
0x87
  toByteString ProtocolLevel
_ UnsubStatus
UnsubTopicFilterInvalid          = Word8 -> ByteString
BL.singleton Word8
0x8F
  toByteString ProtocolLevel
_ UnsubStatus
UnsubPacketIdentifierInUse       = Word8 -> ByteString
BL.singleton Word8
0x91
data UnsubscribeResponse = UnsubscribeResponse PktID [Property] [UnsubStatus] deriving(UnsubscribeResponse -> UnsubscribeResponse -> Bool
(UnsubscribeResponse -> UnsubscribeResponse -> Bool)
-> (UnsubscribeResponse -> UnsubscribeResponse -> Bool)
-> Eq UnsubscribeResponse
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UnsubscribeResponse -> UnsubscribeResponse -> Bool
$c/= :: UnsubscribeResponse -> UnsubscribeResponse -> Bool
== :: UnsubscribeResponse -> UnsubscribeResponse -> Bool
$c== :: UnsubscribeResponse -> UnsubscribeResponse -> Bool
Eq, Int -> UnsubscribeResponse -> ShowS
[UnsubscribeResponse] -> ShowS
UnsubscribeResponse -> String
(Int -> UnsubscribeResponse -> ShowS)
-> (UnsubscribeResponse -> String)
-> ([UnsubscribeResponse] -> ShowS)
-> Show UnsubscribeResponse
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UnsubscribeResponse] -> ShowS
$cshowList :: [UnsubscribeResponse] -> ShowS
show :: UnsubscribeResponse -> String
$cshow :: UnsubscribeResponse -> String
showsPrec :: Int -> UnsubscribeResponse -> ShowS
$cshowsPrec :: Int -> UnsubscribeResponse -> ShowS
Show)
instance ByteMe UnsubscribeResponse where
  toByteString :: ProtocolLevel -> UnsubscribeResponse -> ByteString
toByteString ProtocolLevel
Protocol311 (UnsubscribeResponse Word16
pid [Property]
_ [UnsubStatus]
_) =
    Word8 -> ByteString
BL.singleton Word8
0xb0 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid)
  toByteString ProtocolLevel
Protocol50 (UnsubscribeResponse Word16
pid [Property]
props [UnsubStatus]
res) =
    Word8 -> ByteString
BL.singleton Word8
0xb0 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word16 -> ByteString
encodeWord16 Word16
pid
                                      ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
Protocol50 [Property]
props
                                      ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> [ByteString] -> ByteString
forall a. Monoid a => [a] -> a
mconcat ((UnsubStatus -> ByteString) -> [UnsubStatus] -> [ByteString]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (ProtocolLevel -> UnsubStatus -> ByteString
forall a. ByteMe a => ProtocolLevel -> a -> ByteString
toByteString ProtocolLevel
Protocol50) [UnsubStatus]
res))
parseUnsubACK :: ProtocolLevel -> A.Parser MQTTPkt
parseUnsubACK :: ProtocolLevel -> Parser MQTTPkt
parseUnsubACK ProtocolLevel
Protocol311 = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0xb0
  Int
_ <- Parser Int
parseHdrLen
  Word16
pid <- Parser ByteString Word16
aWord16
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ UnsubscribeResponse -> MQTTPkt
UnsubACKPkt (Word16 -> [Property] -> [UnsubStatus] -> UnsubscribeResponse
UnsubscribeResponse Word16
pid [Property]
forall a. Monoid a => a
mempty [UnsubStatus]
forall a. Monoid a => a
mempty)
parseUnsubACK ProtocolLevel
Protocol50 = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0xb0
  Int
rl <- Parser Int
parseHdrLen
  Word16
pid <- Parser ByteString Word16
aWord16
  [Property]
props <- ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
Protocol50
  [UnsubStatus]
res <- Int
-> Parser ByteString UnsubStatus -> Parser ByteString [UnsubStatus]
forall (m :: * -> *) a. Applicative m => Int -> m a -> m [a]
replicateM (Int
rl Int -> Int -> Int
forall a. Num a => a -> a -> a
- ProtocolLevel -> [Property] -> Int
propLen ProtocolLevel
Protocol50 [Property]
props Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
2) Parser ByteString UnsubStatus
unsubACK
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ UnsubscribeResponse -> MQTTPkt
UnsubACKPkt (Word16 -> [Property] -> [UnsubStatus] -> UnsubscribeResponse
UnsubscribeResponse Word16
pid [Property]
props [UnsubStatus]
res)
  where
    unsubACK :: A.Parser UnsubStatus
    unsubACK :: Parser ByteString UnsubStatus
unsubACK = (UnsubStatus
UnsubSuccess UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x00)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubNoSubscriptionExisted UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x11)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubUnspecifiedError UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x80)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubImplementationSpecificError UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x83)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubNotAuthorized UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x87)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubTopicFilterInvalid UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x8F)
               Parser ByteString UnsubStatus
-> Parser ByteString UnsubStatus -> Parser ByteString UnsubStatus
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (UnsubStatus
UnsubPacketIdentifierInUse UnsubStatus -> Parser Word8 -> Parser ByteString UnsubStatus
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ Word8 -> Parser Word8
A.word8 Word8
0x91)
data AuthRequest = AuthRequest Word8 [Property] deriving (AuthRequest -> AuthRequest -> Bool
(AuthRequest -> AuthRequest -> Bool)
-> (AuthRequest -> AuthRequest -> Bool) -> Eq AuthRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AuthRequest -> AuthRequest -> Bool
$c/= :: AuthRequest -> AuthRequest -> Bool
== :: AuthRequest -> AuthRequest -> Bool
$c== :: AuthRequest -> AuthRequest -> Bool
Eq, Int -> AuthRequest -> ShowS
[AuthRequest] -> ShowS
AuthRequest -> String
(Int -> AuthRequest -> ShowS)
-> (AuthRequest -> String)
-> ([AuthRequest] -> ShowS)
-> Show AuthRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AuthRequest] -> ShowS
$cshowList :: [AuthRequest] -> ShowS
show :: AuthRequest -> String
$cshow :: AuthRequest -> String
showsPrec :: Int -> AuthRequest -> ShowS
$cshowsPrec :: Int -> AuthRequest -> ShowS
Show)
instance ByteMe AuthRequest where
  toByteString :: ProtocolLevel -> AuthRequest -> ByteString
toByteString ProtocolLevel
prot (AuthRequest Word8
i [Property]
props) =
    Word8 -> ByteString
BL.singleton Word8
0xf0 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word8 -> ByteString
BL.singleton Word8
i ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
prot [Property]
props)
parseAuth :: A.Parser MQTTPkt
parseAuth :: Parser MQTTPkt
parseAuth = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0xf0
  Int
_ <- Parser Int
parseHdrLen
  AuthRequest
r <- Word8 -> [Property] -> AuthRequest
AuthRequest (Word8 -> [Property] -> AuthRequest)
-> Parser Word8 -> Parser ByteString ([Property] -> AuthRequest)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Parser Word8
A.anyWord8 Parser ByteString ([Property] -> AuthRequest)
-> Parser [Property] -> Parser ByteString AuthRequest
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
Protocol50
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ AuthRequest -> MQTTPkt
AuthPkt AuthRequest
r
data DiscoReason = DiscoNormalDisconnection
  | DiscoDisconnectWithWill
  | DiscoUnspecifiedError
  | DiscoMalformedPacket
  | DiscoProtocolError
  | DiscoImplementationSpecificError
  | DiscoNotAuthorized
  | DiscoServerBusy
  | DiscoServershuttingDown
  | DiscoKeepAliveTimeout
  | DiscoSessiontakenOver
  | DiscoTopicFilterInvalid
  | DiscoTopicNameInvalid
  | DiscoReceiveMaximumExceeded
  | DiscoTopicAliasInvalid
  | DiscoPacketTooLarge
  | DiscoMessageRateTooHigh
  | DiscoQuotaExceeded
  | DiscoAdministrativeAction
  | DiscoPayloadFormatInvalid
  | DiscoRetainNotSupported
  | DiscoQoSNotSupported
  | DiscoUseAnotherServer
  | DiscoServerMoved
  | DiscoSharedSubscriptionsNotSupported
  | DiscoConnectionRateExceeded
  | DiscoMaximumConnectTime
  | DiscoSubscriptionIdentifiersNotSupported
  | DiscoWildcardSubscriptionsNotSupported
  deriving (Int -> DiscoReason -> ShowS
[DiscoReason] -> ShowS
DiscoReason -> String
(Int -> DiscoReason -> ShowS)
-> (DiscoReason -> String)
-> ([DiscoReason] -> ShowS)
-> Show DiscoReason
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DiscoReason] -> ShowS
$cshowList :: [DiscoReason] -> ShowS
show :: DiscoReason -> String
$cshow :: DiscoReason -> String
showsPrec :: Int -> DiscoReason -> ShowS
$cshowsPrec :: Int -> DiscoReason -> ShowS
Show, DiscoReason -> DiscoReason -> Bool
(DiscoReason -> DiscoReason -> Bool)
-> (DiscoReason -> DiscoReason -> Bool) -> Eq DiscoReason
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DiscoReason -> DiscoReason -> Bool
$c/= :: DiscoReason -> DiscoReason -> Bool
== :: DiscoReason -> DiscoReason -> Bool
$c== :: DiscoReason -> DiscoReason -> Bool
Eq, DiscoReason
DiscoReason -> DiscoReason -> Bounded DiscoReason
forall a. a -> a -> Bounded a
maxBound :: DiscoReason
$cmaxBound :: DiscoReason
minBound :: DiscoReason
$cminBound :: DiscoReason
Bounded, Int -> DiscoReason
DiscoReason -> Int
DiscoReason -> [DiscoReason]
DiscoReason -> DiscoReason
DiscoReason -> DiscoReason -> [DiscoReason]
DiscoReason -> DiscoReason -> DiscoReason -> [DiscoReason]
(DiscoReason -> DiscoReason)
-> (DiscoReason -> DiscoReason)
-> (Int -> DiscoReason)
-> (DiscoReason -> Int)
-> (DiscoReason -> [DiscoReason])
-> (DiscoReason -> DiscoReason -> [DiscoReason])
-> (DiscoReason -> DiscoReason -> [DiscoReason])
-> (DiscoReason -> DiscoReason -> DiscoReason -> [DiscoReason])
-> Enum DiscoReason
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: DiscoReason -> DiscoReason -> DiscoReason -> [DiscoReason]
$cenumFromThenTo :: DiscoReason -> DiscoReason -> DiscoReason -> [DiscoReason]
enumFromTo :: DiscoReason -> DiscoReason -> [DiscoReason]
$cenumFromTo :: DiscoReason -> DiscoReason -> [DiscoReason]
enumFromThen :: DiscoReason -> DiscoReason -> [DiscoReason]
$cenumFromThen :: DiscoReason -> DiscoReason -> [DiscoReason]
enumFrom :: DiscoReason -> [DiscoReason]
$cenumFrom :: DiscoReason -> [DiscoReason]
fromEnum :: DiscoReason -> Int
$cfromEnum :: DiscoReason -> Int
toEnum :: Int -> DiscoReason
$ctoEnum :: Int -> DiscoReason
pred :: DiscoReason -> DiscoReason
$cpred :: DiscoReason -> DiscoReason
succ :: DiscoReason -> DiscoReason
$csucc :: DiscoReason -> DiscoReason
Enum)
instance ByteSize DiscoReason where
  toByte :: DiscoReason -> Word8
toByte DiscoReason
DiscoNormalDisconnection                 = Word8
0x00
  toByte DiscoReason
DiscoDisconnectWithWill                  = Word8
0x04
  toByte DiscoReason
DiscoUnspecifiedError                    = Word8
0x80
  toByte DiscoReason
DiscoMalformedPacket                     = Word8
0x81
  toByte DiscoReason
DiscoProtocolError                       = Word8
0x82
  toByte DiscoReason
DiscoImplementationSpecificError         = Word8
0x83
  toByte DiscoReason
DiscoNotAuthorized                       = Word8
0x87
  toByte DiscoReason
DiscoServerBusy                          = Word8
0x89
  toByte DiscoReason
DiscoServershuttingDown                  = Word8
0x8B
  toByte DiscoReason
DiscoKeepAliveTimeout                    = Word8
0x8D
  toByte DiscoReason
DiscoSessiontakenOver                    = Word8
0x8e
  toByte DiscoReason
DiscoTopicFilterInvalid                  = Word8
0x8f
  toByte DiscoReason
DiscoTopicNameInvalid                    = Word8
0x90
  toByte DiscoReason
DiscoReceiveMaximumExceeded              = Word8
0x93
  toByte DiscoReason
DiscoTopicAliasInvalid                   = Word8
0x94
  toByte DiscoReason
DiscoPacketTooLarge                      = Word8
0x95
  toByte DiscoReason
DiscoMessageRateTooHigh                  = Word8
0x96
  toByte DiscoReason
DiscoQuotaExceeded                       = Word8
0x97
  toByte DiscoReason
DiscoAdministrativeAction                = Word8
0x98
  toByte DiscoReason
DiscoPayloadFormatInvalid                = Word8
0x99
  toByte DiscoReason
DiscoRetainNotSupported                  = Word8
0x9a
  toByte DiscoReason
DiscoQoSNotSupported                     = Word8
0x9b
  toByte DiscoReason
DiscoUseAnotherServer                    = Word8
0x9c
  toByte DiscoReason
DiscoServerMoved                         = Word8
0x9d
  toByte DiscoReason
DiscoSharedSubscriptionsNotSupported     = Word8
0x9e
  toByte DiscoReason
DiscoConnectionRateExceeded              = Word8
0x9f
  toByte DiscoReason
DiscoMaximumConnectTime                  = Word8
0xa0
  toByte DiscoReason
DiscoSubscriptionIdentifiersNotSupported = Word8
0xa1
  toByte DiscoReason
DiscoWildcardSubscriptionsNotSupported   = Word8
0xa2
  fromByte :: Word8 -> DiscoReason
fromByte Word8
w = DiscoReason -> Maybe DiscoReason -> DiscoReason
forall a. a -> Maybe a -> a
fromMaybe DiscoReason
DiscoMalformedPacket (Maybe DiscoReason -> DiscoReason)
-> Maybe DiscoReason -> DiscoReason
forall a b. (a -> b) -> a -> b
$ Word8 -> [(Word8, DiscoReason)] -> Maybe DiscoReason
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Word8
w [(Word8, DiscoReason)]
discoReasonRev
discoReasonRev :: [(Word8, DiscoReason)]
discoReasonRev :: [(Word8, DiscoReason)]
discoReasonRev = (DiscoReason -> (Word8, DiscoReason))
-> [DiscoReason] -> [(Word8, DiscoReason)]
forall a b. (a -> b) -> [a] -> [b]
map (\DiscoReason
w -> (DiscoReason -> Word8
forall a. ByteSize a => a -> Word8
toByte DiscoReason
w, DiscoReason
w)) [DiscoReason
forall a. Bounded a => a
minBound..]
data DisconnectRequest = DisconnectRequest DiscoReason [Property] deriving (DisconnectRequest -> DisconnectRequest -> Bool
(DisconnectRequest -> DisconnectRequest -> Bool)
-> (DisconnectRequest -> DisconnectRequest -> Bool)
-> Eq DisconnectRequest
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DisconnectRequest -> DisconnectRequest -> Bool
$c/= :: DisconnectRequest -> DisconnectRequest -> Bool
== :: DisconnectRequest -> DisconnectRequest -> Bool
$c== :: DisconnectRequest -> DisconnectRequest -> Bool
Eq, Int -> DisconnectRequest -> ShowS
[DisconnectRequest] -> ShowS
DisconnectRequest -> String
(Int -> DisconnectRequest -> ShowS)
-> (DisconnectRequest -> String)
-> ([DisconnectRequest] -> ShowS)
-> Show DisconnectRequest
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DisconnectRequest] -> ShowS
$cshowList :: [DisconnectRequest] -> ShowS
show :: DisconnectRequest -> String
$cshow :: DisconnectRequest -> String
showsPrec :: Int -> DisconnectRequest -> ShowS
$cshowsPrec :: Int -> DisconnectRequest -> ShowS
Show)
instance ByteMe DisconnectRequest where
  toByteString :: ProtocolLevel -> DisconnectRequest -> ByteString
toByteString ProtocolLevel
Protocol311 DisconnectRequest
_ = ByteString
"\224\NUL"
  toByteString ProtocolLevel
Protocol50 (DisconnectRequest DiscoReason
r [Property]
props) =
    Word8 -> ByteString
BL.singleton Word8
0xe0 ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString -> ByteString
withLength (Word8 -> ByteString
BL.singleton (DiscoReason -> Word8
forall a. ByteSize a => a -> Word8
toByte DiscoReason
r) ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ProtocolLevel -> [Property] -> ByteString
bsProps ProtocolLevel
Protocol50 [Property]
props)
parseDisconnect :: ProtocolLevel -> A.Parser MQTTPkt
parseDisconnect :: ProtocolLevel -> Parser MQTTPkt
parseDisconnect ProtocolLevel
Protocol311 = do
  DisconnectRequest
req <- DiscoReason -> [Property] -> DisconnectRequest
DisconnectRequest DiscoReason
DiscoNormalDisconnection [Property]
forall a. Monoid a => a
mempty DisconnectRequest
-> Parser ByteString ByteString
-> Parser ByteString DisconnectRequest
forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ ByteString -> Parser ByteString ByteString
A.string ByteString
"\224\NUL"
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ DisconnectRequest -> MQTTPkt
DisconnectPkt DisconnectRequest
req
parseDisconnect ProtocolLevel
Protocol50 = do
  Word8
_ <- Word8 -> Parser Word8
A.word8 Word8
0xe0
  Int
rl <- Parser Int
parseHdrLen
  Word8
r <- Parser Word8
A.anyWord8
  [Property]
props <- if Int
rl Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
1 then ProtocolLevel -> Parser [Property]
parseProperties ProtocolLevel
Protocol50 else [Property] -> Parser [Property]
forall (f :: * -> *) a. Applicative f => a -> f a
pure [Property]
forall a. Monoid a => a
mempty
  MQTTPkt -> Parser MQTTPkt
forall (f :: * -> *) a. Applicative f => a -> f a
pure (MQTTPkt -> Parser MQTTPkt) -> MQTTPkt -> Parser MQTTPkt
forall a b. (a -> b) -> a -> b
$ DisconnectRequest -> MQTTPkt
DisconnectPkt (DiscoReason -> [Property] -> DisconnectRequest
DisconnectRequest (Word8 -> DiscoReason
forall a. ByteSize a => Word8 -> a
fromByte Word8
r) [Property]
props)