module Data.ByteString.IsoBaseFileFormat.Boxes.ProgressiveDownloadInformation
where
import Data.ByteString.IsoBaseFileFormat.Boxes.Box
import Data.ByteString.IsoBaseFileFormat.Boxes.BoxFields
import Data.ByteString.IsoBaseFileFormat.Boxes.FullBox
data ProgressiveDownload
instance IsBoxType ProgressiveDownload where
type BoxContent ProgressiveDownload = FullBox 0 ProgressiveDownloadContent
toBoxType _ _ = StdType "pdin"
type ProgressiveDownloadContent = U32 "rate" :+ U32 "delay"
pdinBox
:: ValidBox brand ProgressiveDownload
=> ProgressiveDownloadContent -> Box brand ProgressiveDownload
pdinBox = closedFullBox Default 0