mediabus-0.2.0.1: Multimedia streaming on top of Conduit

Safe HaskellNone
LanguageHaskell2010

Data.MediaBus.Audio.Channels

Documentation

data ChannelLayout Source #

Constructors

SingleChannel 
ChannelPair 

Instances

Enum ChannelLayout Source # 
Eq ChannelLayout Source # 
Ord ChannelLayout Source # 
Show ChannelLayout Source # 
Generic ChannelLayout Source # 

Associated Types

type Rep ChannelLayout :: * -> * #

NFData ChannelLayout Source # 

Methods

rnf :: ChannelLayout -> () #

type Rep ChannelLayout Source # 
type Rep ChannelLayout = D1 (MetaData "ChannelLayout" "Data.MediaBus.Audio.Channels" "mediabus-0.2.0.1-GufOXSQMJOgBSiYlFFnZ4L" False) ((:+:) (C1 (MetaCons "SingleChannel" PrefixI False) U1) (C1 (MetaCons "ChannelPair" PrefixI False) U1))

data ChannelPair a Source #

Constructors

MkChannelPair a a 

Instances

Eq a => Eq (ChannelPair a) Source # 
Ord a => Ord (ChannelPair a) Source # 
Show a => Show (ChannelPair a) Source # 
Generic (ChannelPair a) Source # 

Associated Types

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

Methods

from :: ChannelPair a -> Rep (ChannelPair a) x #

to :: Rep (ChannelPair a) x -> ChannelPair a #

Arbitrary a => Arbitrary (ChannelPair a) Source # 
Storable s => Storable (ChannelPair s) Source # 
NFData a => NFData (ChannelPair a) Source # 

Methods

rnf :: ChannelPair a -> () #

CanBeBlank r => CanBeBlank (ChannelPair r) Source # 
HasChannelLayout a => HasChannelLayout (ChannelPair a) Source # 
IsAudioSample a => IsAudioSample (ChannelPair a) Source # 
HasDuration (Proxy * a) => HasDuration (Proxy * (ChannelPair a)) Source # 
type Rep (ChannelPair a) Source # 
type Rep (ChannelPair a) = D1 (MetaData "ChannelPair" "Data.MediaBus.Audio.Channels" "mediabus-0.2.0.1-GufOXSQMJOgBSiYlFFnZ4L" False) (C1 (MetaCons "MkChannelPair" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_leftSample") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)) (S1 (MetaSel (Just Symbol "_rightSample") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a))))
type GetAudioSampleRate (ChannelPair a) Source # 
type SetAudioSampleRate (ChannelPair a) x Source # 

leftSample :: forall a. Lens' (ChannelPair a) a Source #

rightSample :: forall a. Lens' (ChannelPair a) a Source #