ble-0.3.2.1: Bluetooth Low Energy (BLE) peripherals

Safe HaskellNone
LanguageHaskell2010

Bluetooth.Internal.Types

Contents

Synopsis

Documentation

(</>) :: Text -> Text -> Text Source #

Append two Texts, keeping exactly one slash between them.

UUID

data UUID Source #

UUIDs, used for services and characteristics.

Unofficial UUIDs will have 128-bits, and will look this:

d45e83fb-c772-459e-91a8-43cbf1443af4

Official UUIDs will have either 32 or 16 bits.

See ITU-T Rec. X.677 for more information on the format and generation of these UUIDs. You can use the Online UUID Generator to generate UUIDs.

Constructors

UUID UUID 

Instances

Eq UUID Source # 

Methods

(==) :: UUID -> UUID -> Bool #

(/=) :: UUID -> UUID -> Bool #

Ord UUID Source # 

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Show UUID Source # 

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

IsString UUID Source # 

Methods

fromString :: String -> UUID #

Generic UUID Source # 

Associated Types

type Rep UUID :: * -> * #

Methods

from :: UUID -> Rep UUID x #

to :: Rep UUID x -> UUID #

Representable UUID Source # 

Associated Types

type RepType UUID :: DBusType #

Random UUID Source # 

Methods

randomR :: RandomGen g => (UUID, UUID) -> g -> (UUID, g) #

random :: RandomGen g => g -> (UUID, g) #

randomRs :: RandomGen g => (UUID, UUID) -> g -> [UUID] #

randoms :: RandomGen g => g -> [UUID] #

randomRIO :: (UUID, UUID) -> IO UUID #

randomIO :: IO UUID #

HasUuid Service UUID Source # 
HasSolicitUUIDs Advertisement [UUID] Source # 
HasServiceUUIDs Advertisement [UUID] Source # 
HasServiceData Advertisement (Map UUID ByteString) Source # 
HasUuid (Characteristic typ0) UUID Source # 
type Rep UUID Source # 
type Rep UUID = D1 (MetaData "UUID" "Bluetooth.Internal.Types" "ble-0.3.2.1-CN6DoflpPH3E1jk6d9fCyB" False) (C1 (MetaCons "UUID" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 UUID)))
type RepType UUID Source # 

Any

data Any where Source #

A Haskell existential type corresponding to DBus' Variant.

Constructors

MkAny :: forall a. Representable a => a -> Any 

Instances

data WithObjectPath a Source #

Instances

Functor WithObjectPath Source # 

Methods

fmap :: (a -> b) -> WithObjectPath a -> WithObjectPath b #

(<$) :: a -> WithObjectPath b -> WithObjectPath a #

Eq a => Eq (WithObjectPath a) Source # 
Show a => Show (WithObjectPath a) Source # 
Generic (WithObjectPath a) Source # 

Associated Types

type Rep (WithObjectPath a) :: * -> * #

Representable (WithObjectPath (Characteristic a)) Source # 
Representable (WithObjectPath Service) Source # 
HasValue (WithObjectPath a0) a0 Source # 

Methods

value :: Lens' (WithObjectPath a0) a0 Source #

HasPath (WithObjectPath a0) ObjectPath Source # 
HasInterface (WithObjectPath CharacteristicBS) GattCharacteristic Source # 
HasInterface (WithObjectPath CharacteristicBS) Properties Source # 
HasInterface (WithObjectPath Service) GattService Source # 
HasInterface (WithObjectPath Service) Properties Source # 
HasInterface (WithObjectPath Advertisement) LEAdvertisement Source # 
type Rep (WithObjectPath a) Source # 
type Rep (WithObjectPath a) = D1 (MetaData "WithObjectPath" "Bluetooth.Internal.Types" "ble-0.3.2.1-CN6DoflpPH3E1jk6d9fCyB" False) (C1 (MetaCons "WOP" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "withObjectPathPath") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ObjectPath)) (S1 (MetaSel (Just Symbol "withObjectPathValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a))))
type RepType (WithObjectPath (Characteristic a)) Source # 
type RepType (WithObjectPath Service) Source # 

class HasPath s a | s -> a where Source #

Minimal complete definition

path

Methods

path ::