mediabus-0.2.0.1: Multimedia streaming on top of Conduit

Safe HaskellNone
LanguageHaskell2010

Data.MediaBus.Audio.Raw

Documentation

newtype S16 rate Source #

Constructors

MkS16 Int16 

Instances

KnownNat r => HasDebugPlaybackSink s t (SampleBuffer (S16 r)) Source # 

Methods

debugPlaybackSink :: MonadIO m => Sink (Frame s t (SampleBuffer (S16 r))) m () Source #

Eq (S16 rate) Source # 

Methods

(==) :: S16 rate -> S16 rate -> Bool #

(/=) :: S16 rate -> S16 rate -> Bool #

Num (S16 rate) Source # 

Methods

(+) :: S16 rate -> S16 rate -> S16 rate #

(-) :: S16 rate -> S16 rate -> S16 rate #

(*) :: S16 rate -> S16 rate -> S16 rate #

negate :: S16 rate -> S16 rate #

abs :: S16 rate -> S16 rate #

signum :: S16 rate -> S16 rate #

fromInteger :: Integer -> S16 rate #

Ord (S16 rate) Source # 

Methods

compare :: S16 rate -> S16 rate -> Ordering #

(<) :: S16 rate -> S16 rate -> Bool #

(<=) :: S16 rate -> S16 rate -> Bool #

(>) :: S16 rate -> S16 rate -> Bool #

(>=) :: S16 rate -> S16 rate -> Bool #

max :: S16 rate -> S16 rate -> S16 rate #

min :: S16 rate -> S16 rate -> S16 rate #

Show (S16 r) Source # 

Methods

showsPrec :: Int -> S16 r -> ShowS #

show :: S16 r -> String #

showList :: [S16 r] -> ShowS #

Generic (S16 rate) Source # 

Associated Types

type Rep (S16 rate) :: * -> * #

Methods

from :: S16 rate -> Rep (S16 rate) x #

to :: Rep (S16 rate) x -> S16 rate #

Arbitrary (S16 rate) Source # 

Methods

arbitrary :: Gen (S16 rate) #

shrink :: S16 rate -> [S16 rate] #

Storable (S16 rate) Source # 

Methods

sizeOf :: S16 rate -> Int #

alignment :: S16 rate -> Int #

peekElemOff :: Ptr (S16 rate) -> Int -> IO (S16 rate) #

pokeElemOff :: Ptr (S16 rate) -> Int -> S16 rate -> IO () #

peekByteOff :: Ptr b -> Int -> IO (S16 rate) #

pokeByteOff :: Ptr b -> Int -> S16 rate -> IO () #

peek :: Ptr (S16 rate) -> IO (S16 rate) #

poke :: Ptr (S16 rate) -> S16 rate -> IO () #

NFData (S16 rate) Source # 

Methods

rnf :: S16 rate -> () #

CanBeBlank (S16 r) Source # 

Methods

blank :: S16 r Source #

HasChannelLayout (S16 r) Source # 
KnownNat r => IsAudioSample (S16 r) Source # 

Associated Types

type GetAudioSampleRate (S16 r) :: Nat Source #

type SetAudioSampleRate (S16 r) (b :: Nat) :: * Source #

Methods

avgSamples :: S16 r -> S16 r -> S16 r Source #

setAudioSampleRate :: KnownNat r => proxy r -> S16 r -> SetAudioSampleRate (S16 r) r Source #

Transcoder (SampleBuffer (S16 8000)) (SampleBuffer ALaw) Source # 
Transcoder (SampleBuffer ALaw) (SampleBuffer (S16 8000)) Source # 
KnownNat r => HasDuration (Proxy * (S16 r)) Source # 
type Rep (S16 rate) Source # 
type Rep (S16 rate) = D1 (MetaData "S16" "Data.MediaBus.Audio.Raw" "mediabus-0.2.0.1-GufOXSQMJOgBSiYlFFnZ4L" True) (C1 (MetaCons "MkS16" PrefixI True) (S1 (MetaSel (Just Symbol "_s16Sample") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int16)))
type GetAudioSampleRate (S16 r) Source # 
type GetAudioSampleRate (S16 r) = r
type SetAudioSampleRate (S16 r) x Source # 
type SetAudioSampleRate (S16 r) x = S16 x
type TranscodingSeqNum (SampleBuffer (S16 8000)) (SampleBuffer ALaw) s Source # 
type TranscodingSeqNum (SampleBuffer ALaw) (SampleBuffer (S16 8000)) s Source # 
type TranscodingTicks (SampleBuffer (S16 8000)) (SampleBuffer ALaw) t Source # 
type TranscodingTicks (SampleBuffer ALaw) (SampleBuffer (S16 8000)) t Source # 

s16Sample :: forall rate rate. Iso (S16 rate) (S16 rate) Int16 Int16 Source #

class (KnownNat (GetAudioSampleRate a), SetAudioSampleRate a (GetAudioSampleRate a) ~ a, Show a, Storable a, Eq a, Ord a, Arbitrary a) => IsAudioSample a where Source #

Minimal complete definition

avgSamples, setAudioSampleRate

Associated Types

type GetAudioSampleRate a :: Nat Source #

type SetAudioSampleRate a (b :: Nat) Source #

Methods

avgSamples :: a -> a -> a Source #

setAudioSampleRate :: KnownNat r => proxy r -> a -> SetAudioSampleRate a r Source #