Safe Haskell | None |
---|---|
Language | Haskell2010 |
Codec.FFmpeg.Enums
Documentation
newtype AVMediaType Source #
Constructors
AVMediaType CInt |
Instances
Eq AVMediaType Source # | |
Defined in Codec.FFmpeg.Enums | |
Storable AVMediaType Source # | |
Defined in Codec.FFmpeg.Enums Methods sizeOf :: AVMediaType -> Int # alignment :: AVMediaType -> Int # peekElemOff :: Ptr AVMediaType -> Int -> IO AVMediaType # pokeElemOff :: Ptr AVMediaType -> Int -> AVMediaType -> IO () # peekByteOff :: Ptr b -> Int -> IO AVMediaType # pokeByteOff :: Ptr b -> Int -> AVMediaType -> IO () # peek :: Ptr AVMediaType -> IO AVMediaType # poke :: Ptr AVMediaType -> AVMediaType -> IO () # |
newtype AVPixelFormat Source #
Constructors
AVPixelFormat CInt |
Instances
Eq AVPixelFormat Source # | |
Defined in Codec.FFmpeg.Enums Methods (==) :: AVPixelFormat -> AVPixelFormat -> Bool # (/=) :: AVPixelFormat -> AVPixelFormat -> Bool # | |
Show AVPixelFormat Source # | |
Defined in Codec.FFmpeg.Enums Methods showsPrec :: Int -> AVPixelFormat -> ShowS # show :: AVPixelFormat -> String # showList :: [AVPixelFormat] -> ShowS # | |
Storable AVPixelFormat Source # | |
Defined in Codec.FFmpeg.Enums Methods sizeOf :: AVPixelFormat -> Int # alignment :: AVPixelFormat -> Int # peekElemOff :: Ptr AVPixelFormat -> Int -> IO AVPixelFormat # pokeElemOff :: Ptr AVPixelFormat -> Int -> AVPixelFormat -> IO () # peekByteOff :: Ptr b -> Int -> IO AVPixelFormat # pokeByteOff :: Ptr b -> Int -> AVPixelFormat -> IO () # peek :: Ptr AVPixelFormat -> IO AVPixelFormat # poke :: Ptr AVPixelFormat -> AVPixelFormat -> IO () # | |
SwsCompatible (AVPixelFormat, V2 CInt, Vector CUChar) Source # | |
Defined in Codec.FFmpeg.Scaler |
Instances
Eq AVCodecID Source # | |
Show AVCodecID Source # | |
Storable AVCodecID Source # | |
Defined in Codec.FFmpeg.Enums |
newtype SwsAlgorithm Source #
Constructors
SwsAlgorithm CUInt |
Instances
Eq SwsAlgorithm Source # | |
Defined in Codec.FFmpeg.Enums | |
Show SwsAlgorithm Source # | |
Defined in Codec.FFmpeg.Enums Methods showsPrec :: Int -> SwsAlgorithm -> ShowS # show :: SwsAlgorithm -> String # showList :: [SwsAlgorithm] -> ShowS # | |
Storable SwsAlgorithm Source # | |
Defined in Codec.FFmpeg.Enums Methods sizeOf :: SwsAlgorithm -> Int # alignment :: SwsAlgorithm -> Int # peekElemOff :: Ptr SwsAlgorithm -> Int -> IO SwsAlgorithm # pokeElemOff :: Ptr SwsAlgorithm -> Int -> SwsAlgorithm -> IO () # peekByteOff :: Ptr b -> Int -> IO SwsAlgorithm # pokeByteOff :: Ptr b -> Int -> SwsAlgorithm -> IO () # peek :: Ptr SwsAlgorithm -> IO SwsAlgorithm # poke :: Ptr SwsAlgorithm -> SwsAlgorithm -> IO () # |
swsX :: SwsAlgorithm Source #
Instances
Eq FFProfile Source # | |
Storable FFProfile Source # | |
Defined in Codec.FFmpeg.Enums |
Instances
Eq AVIOFlag Source # | |
Storable AVIOFlag Source # | |
Defined in Codec.FFmpeg.Enums |
newtype AVRoundMode Source #
Constructors
AVRoundMode CInt |
Instances
Eq AVRoundMode Source # | |
Defined in Codec.FFmpeg.Enums | |
Storable AVRoundMode Source # | |
Defined in Codec.FFmpeg.Enums Methods sizeOf :: AVRoundMode -> Int # alignment :: AVRoundMode -> Int # peekElemOff :: Ptr AVRoundMode -> Int -> IO AVRoundMode # pokeElemOff :: Ptr AVRoundMode -> Int -> AVRoundMode -> IO () # peekByteOff :: Ptr b -> Int -> IO AVRoundMode # pokeByteOff :: Ptr b -> Int -> AVRoundMode -> IO () # peek :: Ptr AVRoundMode -> IO AVRoundMode # poke :: Ptr AVRoundMode -> AVRoundMode -> IO () # |
Instances
Eq CodecFlag Source # | |
Storable CodecFlag Source # | |
Defined in Codec.FFmpeg.Enums | |
Bits CodecFlag Source # | |
Defined in Codec.FFmpeg.Enums Methods (.&.) :: CodecFlag -> CodecFlag -> CodecFlag # (.|.) :: CodecFlag -> CodecFlag -> CodecFlag # xor :: CodecFlag -> CodecFlag -> CodecFlag # complement :: CodecFlag -> CodecFlag # shift :: CodecFlag -> Int -> CodecFlag # rotate :: CodecFlag -> Int -> CodecFlag # setBit :: CodecFlag -> Int -> CodecFlag # clearBit :: CodecFlag -> Int -> CodecFlag # complementBit :: CodecFlag -> Int -> CodecFlag # testBit :: CodecFlag -> Int -> Bool # bitSizeMaybe :: CodecFlag -> Maybe Int # isSigned :: CodecFlag -> Bool # shiftL :: CodecFlag -> Int -> CodecFlag # unsafeShiftL :: CodecFlag -> Int -> CodecFlag # shiftR :: CodecFlag -> Int -> CodecFlag # unsafeShiftR :: CodecFlag -> Int -> CodecFlag # rotateL :: CodecFlag -> Int -> CodecFlag # |
newtype FormatFlag Source #
Constructors
FormatFlag CInt |
Instances
newtype PacketFlag Source #
Constructors
PacketFlag CInt |
Instances
Instances
Eq LogLevel Source # | |
Storable LogLevel Source # | |
Defined in Codec.FFmpeg.Enums | |
Bits LogLevel Source # | |
Defined in Codec.FFmpeg.Enums Methods (.&.) :: LogLevel -> LogLevel -> LogLevel # (.|.) :: LogLevel -> LogLevel -> LogLevel # xor :: LogLevel -> LogLevel -> LogLevel # complement :: LogLevel -> LogLevel # shift :: LogLevel -> Int -> LogLevel # rotate :: LogLevel -> Int -> LogLevel # setBit :: LogLevel -> Int -> LogLevel # clearBit :: LogLevel -> Int -> LogLevel # complementBit :: LogLevel -> Int -> LogLevel # testBit :: LogLevel -> Int -> Bool # bitSizeMaybe :: LogLevel -> Maybe Int # isSigned :: LogLevel -> Bool # shiftL :: LogLevel -> Int -> LogLevel # unsafeShiftL :: LogLevel -> Int -> LogLevel # shiftR :: LogLevel -> Int -> LogLevel # unsafeShiftR :: LogLevel -> Int -> LogLevel # rotateL :: LogLevel -> Int -> LogLevel # |
newtype AVSampleFormat Source #
Constructors
AVSampleFormat CInt |