dtab-1.1.1.1: Harmonix (Guitar Hero, Rock Band) DTA/DTB metadata library

Safe HaskellNone
LanguageHaskell2010

Data.DTA

Description

All functions that take a Handle or FilePath do their reading/writing strictly.

Synopsis

Documentation

data DTA Source #

A top-level file.

Constructors

DTA 

Fields

Instances
Eq DTA Source # 
Instance details

Defined in Data.DTA.Base

Methods

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

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

Data DTA Source # 
Instance details

Defined in Data.DTA.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DTA -> c DTA #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DTA #

toConstr :: DTA -> Constr #

dataTypeOf :: DTA -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DTA) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DTA) #

gmapT :: (forall b. Data b => b -> b) -> DTA -> DTA #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DTA -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DTA -> r #

gmapQ :: (forall d. Data d => d -> u) -> DTA -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DTA -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DTA -> m DTA #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DTA -> m DTA #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DTA -> m DTA #

Ord DTA Source # 
Instance details

Defined in Data.DTA.Base

Methods

compare :: DTA -> DTA -> Ordering #

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

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

(>) :: DTA -> DTA -> Bool #

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

max :: DTA -> DTA -> DTA #

min :: DTA -> DTA -> DTA #

Read DTA Source # 
Instance details

Defined in Data.DTA.Base

Show DTA Source # 
Instance details

Defined in Data.DTA.Base

Methods

showsPrec :: Int -> DTA -> ShowS #

show :: DTA -> String #

showList :: [DTA] -> ShowS #

Binary DTA Source # 
Instance details

Defined in Data.DTA.Base

Methods

put :: DTA -> Put #

get :: Get DTA #

putList :: [DTA] -> Put #

data Tree Source #

A list of chunks, for either the top-level tree or a subtree.

Constructors

Tree 

Fields

Instances
Eq Tree Source # 
Instance details

Defined in Data.DTA.Base

Methods

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

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

Data Tree Source # 
Instance details

Defined in Data.DTA.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tree -> c Tree #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Tree #

toConstr :: Tree -> Constr #

dataTypeOf :: Tree -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Tree) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Tree) #

gmapT :: (forall b. Data b => b -> b) -> Tree -> Tree #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tree -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tree -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tree -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tree -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tree -> m Tree #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree -> m Tree #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree -> m Tree #

Ord Tree Source # 
Instance details

Defined in Data.DTA.Base

Methods

compare :: Tree -> Tree -> Ordering #

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

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

(>) :: Tree -> Tree -> Bool #

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

max :: Tree -> Tree -> Tree #

min :: Tree -> Tree -> Tree #

Read Tree Source # 
Instance details

Defined in Data.DTA.Base

Show Tree Source # 
Instance details

Defined in Data.DTA.Base

Methods

showsPrec :: Int -> Tree -> ShowS #

show :: Tree -> String #

showList :: [Tree] -> ShowS #

Binary Tree Source # 
Instance details

Defined in Data.DTA.Base

Methods

put :: Tree -> Put #

get :: Get Tree #

putList :: [Tree] -> Put #

data Chunk Source #

A data value, which may be a subtree. The constructors are ordered by their chunk identification tag in the binary format.

Instances
Eq Chunk Source # 
Instance details

Defined in Data.DTA.Base

Methods

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

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

Data Chunk Source # 
Instance details

Defined in Data.DTA.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Chunk -> c Chunk #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Chunk #

toConstr :: Chunk -> Constr #

dataTypeOf :: Chunk -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Chunk) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Chunk) #

gmapT :: (forall b. Data b => b -> b) -> Chunk -> Chunk #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Chunk -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Chunk -> r #

gmapQ :: (forall d. Data d => d -> u) -> Chunk -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Chunk -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Chunk -> m Chunk #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Chunk -> m Chunk #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Chunk -> m Chunk #

Ord Chunk Source # 
Instance details

Defined in Data.DTA.Base

Methods

compare :: Chunk -> Chunk -> Ordering #

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

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

(>) :: Chunk -> Chunk -> Bool #

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

max :: Chunk -> Chunk -> Chunk #

min :: Chunk -> Chunk -> Chunk #

Read Chunk Source # 
Instance details

Defined in Data.DTA.Base

Show Chunk Source # 
Instance details

Defined in Data.DTA.Base

Methods

showsPrec :: Int -> Chunk -> ShowS #

show :: Chunk -> String #

showList :: [Chunk] -> ShowS #

Binary Chunk Source # 
Instance details

Defined in Data.DTA.Base

Methods

put :: Chunk -> Put #

get :: Get Chunk #

putList :: [Chunk] -> Put #

hToDTB :: Handle -> DTA -> IO () Source #

toDTB :: FilePath -> DTA -> IO () Source #

hToDTA :: Handle -> DTA -> IO () Source #

toDTA :: FilePath -> DTA -> IO () Source #

renumberFrom :: Word32 -> DTA -> DTA Source #

Assign new sequential node IDs to each tree in a DTA, starting with the top-level tree.