{-# LANGUAGE TypeApplications #-}


-- | Copyright  : Will Thompson and Iñaki García Etxebarria
-- License    : LGPL-2.1
-- Maintainer : Iñaki García Etxebarria
-- 
-- Opaque structure.

#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif

module GI.Gst.Structs.ParseContext
    ( 

-- * Exported types
    ParseContext(..)                        ,


 -- * Methods
-- | 
-- 
--  === __Click to display all available methods, including inherited ones__
-- ==== Methods
-- [copy]("GI.Gst.Structs.ParseContext#g:method:copy"), [free]("GI.Gst.Structs.ParseContext#g:method:free").
-- 
-- ==== Getters
-- [getMissingElements]("GI.Gst.Structs.ParseContext#g:method:getMissingElements").
-- 
-- ==== Setters
-- /None/.

#if defined(ENABLE_OVERLOADING)
    ResolveParseContextMethod               ,
#endif

-- ** copy #method:copy#

#if defined(ENABLE_OVERLOADING)
    ParseContextCopyMethodInfo              ,
#endif
    parseContextCopy                        ,


-- ** free #method:free#

#if defined(ENABLE_OVERLOADING)
    ParseContextFreeMethodInfo              ,
#endif
    parseContextFree                        ,


-- ** getMissingElements #method:getMissingElements#

#if defined(ENABLE_OVERLOADING)
    ParseContextGetMissingElementsMethodInfo,
#endif
    parseContextGetMissingElements          ,


-- ** new #method:new#

    parseContextNew                         ,




    ) where

import Data.GI.Base.ShortPrelude
import qualified Data.GI.Base.ShortPrelude as SP
import qualified Data.GI.Base.Overloading as O
import qualified Prelude as P

import qualified Data.GI.Base.Attributes as GI.Attributes
import qualified Data.GI.Base.BasicTypes as B.Types
import qualified Data.GI.Base.ManagedPtr as B.ManagedPtr
import qualified Data.GI.Base.GArray as B.GArray
import qualified Data.GI.Base.GClosure as B.GClosure
import qualified Data.GI.Base.GError as B.GError
import qualified Data.GI.Base.GHashTable as B.GHT
import qualified Data.GI.Base.GVariant as B.GVariant
import qualified Data.GI.Base.GValue as B.GValue
import qualified Data.GI.Base.GParamSpec as B.GParamSpec
import qualified Data.GI.Base.CallStack as B.CallStack
import qualified Data.GI.Base.Properties as B.Properties
import qualified Data.GI.Base.Signals as B.Signals
import qualified Control.Monad.IO.Class as MIO
import qualified Data.Coerce as Coerce
import qualified Data.Text as T
import qualified Data.ByteString.Char8 as B
import qualified Data.Map as Map
import qualified Foreign.Ptr as FP
import qualified GHC.OverloadedLabels as OL
import qualified GHC.Records as R


-- | Memory-managed wrapper type.
newtype ParseContext = ParseContext (SP.ManagedPtr ParseContext)
    deriving (ParseContext -> ParseContext -> Bool
(ParseContext -> ParseContext -> Bool)
-> (ParseContext -> ParseContext -> Bool) -> Eq ParseContext
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ParseContext -> ParseContext -> Bool
== :: ParseContext -> ParseContext -> Bool
$c/= :: ParseContext -> ParseContext -> Bool
/= :: ParseContext -> ParseContext -> Bool
Eq)

instance SP.ManagedPtrNewtype ParseContext where
    toManagedPtr :: ParseContext -> ManagedPtr ParseContext
toManagedPtr (ParseContext ManagedPtr ParseContext
p) = ManagedPtr ParseContext
p

foreign import ccall "gst_parse_context_get_type" c_gst_parse_context_get_type :: 
    IO GType

type instance O.ParentTypes ParseContext = '[]
instance O.HasParentTypes ParseContext

instance B.Types.TypedObject ParseContext where
    glibType :: IO GType
glibType = IO GType
c_gst_parse_context_get_type

instance B.Types.GBoxed ParseContext

-- | Convert 'ParseContext' to and from 'Data.GI.Base.GValue.GValue'. See 'Data.GI.Base.GValue.toGValue' and 'Data.GI.Base.GValue.fromGValue'.
instance B.GValue.IsGValue (Maybe ParseContext) where
    gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_gst_parse_context_get_type
    gvalueSet_ :: Ptr GValue -> Maybe ParseContext -> IO ()
gvalueSet_ Ptr GValue
gv Maybe ParseContext
P.Nothing = Ptr GValue -> Ptr ParseContext -> IO ()
forall a. Ptr GValue -> Ptr a -> IO ()
B.GValue.set_boxed Ptr GValue
gv (Ptr ParseContext
forall a. Ptr a
FP.nullPtr :: FP.Ptr ParseContext)
    gvalueSet_ Ptr GValue
gv (P.Just ParseContext
obj) = ParseContext -> (Ptr ParseContext -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr ParseContext
obj (Ptr GValue -> Ptr ParseContext -> IO ()
forall a. Ptr GValue -> Ptr a -> IO ()
B.GValue.set_boxed Ptr GValue
gv)
    gvalueGet_ :: Ptr GValue -> IO (Maybe ParseContext)
gvalueGet_ Ptr GValue
gv = do
        Ptr ParseContext
ptr <- Ptr GValue -> IO (Ptr ParseContext)
forall b. Ptr GValue -> IO (Ptr b)
B.GValue.get_boxed Ptr GValue
gv :: IO (Ptr ParseContext)
        if Ptr ParseContext
ptr Ptr ParseContext -> Ptr ParseContext -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr ParseContext
forall a. Ptr a
FP.nullPtr
        then ParseContext -> Maybe ParseContext
forall a. a -> Maybe a
P.Just (ParseContext -> Maybe ParseContext)
-> IO ParseContext -> IO (Maybe ParseContext)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr ParseContext -> ParseContext)
-> Ptr ParseContext -> IO ParseContext
forall a.
(HasCallStack, GBoxed a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
B.ManagedPtr.newBoxed ManagedPtr ParseContext -> ParseContext
ParseContext Ptr ParseContext
ptr
        else Maybe ParseContext -> IO (Maybe ParseContext)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe ParseContext
forall a. Maybe a
P.Nothing
        
    


#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList ParseContext
type instance O.AttributeList ParseContext = ParseContextAttributeList
type ParseContextAttributeList = ('[ ] :: [(Symbol, *)])
#endif

-- method ParseContext::new
-- method type : Constructor
-- Args: []
-- Lengths: []
-- returnType: Just
--               (TInterface Name { namespace = "Gst" , name = "ParseContext" })
-- throws : False
-- Skip return : False

foreign import ccall "gst_parse_context_new" gst_parse_context_new :: 
    IO (Ptr ParseContext)

-- | Allocates a parse context for use with 'GI.Gst.Functions.parseLaunchFull' or
-- 'GI.Gst.Functions.parseLaunchvFull'.
-- 
-- Free-function: gst_parse_context_free
parseContextNew ::
    (B.CallStack.HasCallStack, MonadIO m) =>
    m (Maybe ParseContext)
    -- ^ __Returns:__ a newly-allocated parse context. Free
    --     with 'GI.Gst.Structs.ParseContext.parseContextFree' when no longer needed.
parseContextNew :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
m (Maybe ParseContext)
parseContextNew  = IO (Maybe ParseContext) -> m (Maybe ParseContext)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (Maybe ParseContext) -> m (Maybe ParseContext))
-> IO (Maybe ParseContext) -> m (Maybe ParseContext)
forall a b. (a -> b) -> a -> b
$ do
    Ptr ParseContext
result <- IO (Ptr ParseContext)
gst_parse_context_new
    Maybe ParseContext
maybeResult <- Ptr ParseContext
-> (Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext)
forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
convertIfNonNull Ptr ParseContext
result ((Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext))
-> (Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext)
forall a b. (a -> b) -> a -> b
$ \Ptr ParseContext
result' -> do
        ParseContext
result'' <- ((ManagedPtr ParseContext -> ParseContext)
-> Ptr ParseContext -> IO ParseContext
forall a.
(HasCallStack, GBoxed a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapBoxed ManagedPtr ParseContext -> ParseContext
ParseContext) Ptr ParseContext
result'
        ParseContext -> IO ParseContext
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ParseContext
result''
    Maybe ParseContext -> IO (Maybe ParseContext)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe ParseContext
maybeResult

#if defined(ENABLE_OVERLOADING)
#endif

-- method ParseContext::copy
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "context"
--           , argType =
--               TInterface Name { namespace = "Gst" , name = "ParseContext" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #GstParseContext" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just
--               (TInterface Name { namespace = "Gst" , name = "ParseContext" })
-- throws : False
-- Skip return : False

foreign import ccall "gst_parse_context_copy" gst_parse_context_copy :: 
    Ptr ParseContext ->                     -- context : TInterface (Name {namespace = "Gst", name = "ParseContext"})
    IO (Ptr ParseContext)

-- | Copies the /@context@/.
-- 
-- /Since: 1.12.1/
parseContextCopy ::
    (B.CallStack.HasCallStack, MonadIO m) =>
    ParseContext
    -- ^ /@context@/: a t'GI.Gst.Structs.ParseContext.ParseContext'
    -> m (Maybe ParseContext)
    -- ^ __Returns:__ A copied t'GI.Gst.Structs.ParseContext.ParseContext'
parseContextCopy :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
ParseContext -> m (Maybe ParseContext)
parseContextCopy ParseContext
context = IO (Maybe ParseContext) -> m (Maybe ParseContext)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (Maybe ParseContext) -> m (Maybe ParseContext))
-> IO (Maybe ParseContext) -> m (Maybe ParseContext)
forall a b. (a -> b) -> a -> b
$ do
    Ptr ParseContext
context' <- ParseContext -> IO (Ptr ParseContext)
forall a. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr a)
unsafeManagedPtrGetPtr ParseContext
context
    Ptr ParseContext
result <- Ptr ParseContext -> IO (Ptr ParseContext)
gst_parse_context_copy Ptr ParseContext
context'
    Maybe ParseContext
maybeResult <- Ptr ParseContext
-> (Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext)
forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
convertIfNonNull Ptr ParseContext
result ((Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext))
-> (Ptr ParseContext -> IO ParseContext) -> IO (Maybe ParseContext)
forall a b. (a -> b) -> a -> b
$ \Ptr ParseContext
result' -> do
        ParseContext
result'' <- ((ManagedPtr ParseContext -> ParseContext)
-> Ptr ParseContext -> IO ParseContext
forall a.
(HasCallStack, GBoxed a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapBoxed ManagedPtr ParseContext -> ParseContext
ParseContext) Ptr ParseContext
result'
        ParseContext -> IO ParseContext
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ParseContext
result''
    ParseContext -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr ParseContext
context
    Maybe ParseContext -> IO (Maybe ParseContext)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe ParseContext
maybeResult

#if defined(ENABLE_OVERLOADING)
data ParseContextCopyMethodInfo
instance (signature ~ (m (Maybe ParseContext)), MonadIO m) => O.OverloadedMethod ParseContextCopyMethodInfo ParseContext signature where
    overloadedMethod = parseContextCopy

instance O.OverloadedMethodInfo ParseContextCopyMethodInfo ParseContext where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Gst.Structs.ParseContext.parseContextCopy",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-gst-1.0.26/docs/GI-Gst-Structs-ParseContext.html#v:parseContextCopy"
        })


#endif

-- method ParseContext::free
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "context"
--           , argType =
--               TInterface Name { namespace = "Gst" , name = "ParseContext" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #GstParseContext" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferEverything
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "gst_parse_context_free" gst_parse_context_free :: 
    Ptr ParseContext ->                     -- context : TInterface (Name {namespace = "Gst", name = "ParseContext"})
    IO ()

-- | Frees a parse context previously allocated with 'GI.Gst.Structs.ParseContext.parseContextNew'.
parseContextFree ::
    (B.CallStack.HasCallStack, MonadIO m) =>
    ParseContext
    -- ^ /@context@/: a t'GI.Gst.Structs.ParseContext.ParseContext'
    -> m ()
parseContextFree :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
ParseContext -> m ()
parseContextFree ParseContext
context = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr ParseContext
context' <- ParseContext -> IO (Ptr ParseContext)
forall a. (HasCallStack, GBoxed a) => a -> IO (Ptr a)
B.ManagedPtr.disownBoxed ParseContext
context
    Ptr ParseContext -> IO ()
gst_parse_context_free Ptr ParseContext
context'
    ParseContext -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr ParseContext
context
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data ParseContextFreeMethodInfo
instance (signature ~ (m ()), MonadIO m) => O.OverloadedMethod ParseContextFreeMethodInfo ParseContext signature where
    overloadedMethod = parseContextFree

instance O.OverloadedMethodInfo ParseContextFreeMethodInfo ParseContext where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Gst.Structs.ParseContext.parseContextFree",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-gst-1.0.26/docs/GI-Gst-Structs-ParseContext.html#v:parseContextFree"
        })


#endif

-- method ParseContext::get_missing_elements
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "context"
--           , argType =
--               TInterface Name { namespace = "Gst" , name = "ParseContext" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #GstParseContext" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TCArray True (-1) (-1) (TBasicType TUTF8))
-- throws : False
-- Skip return : False

foreign import ccall "gst_parse_context_get_missing_elements" gst_parse_context_get_missing_elements :: 
    Ptr ParseContext ->                     -- context : TInterface (Name {namespace = "Gst", name = "ParseContext"})
    IO (Ptr CString)

-- | Retrieve missing elements from a previous run of 'GI.Gst.Functions.parseLaunchFull'
-- or 'GI.Gst.Functions.parseLaunchvFull'. Will only return results if an error code
-- of 'GI.Gst.Enums.ParseErrorNoSuchElement' was returned.
parseContextGetMissingElements ::
    (B.CallStack.HasCallStack, MonadIO m) =>
    ParseContext
    -- ^ /@context@/: a t'GI.Gst.Structs.ParseContext.ParseContext'
    -> m (Maybe [T.Text])
    -- ^ __Returns:__ a
    --     'P.Nothing'-terminated array of element factory name strings of missing
    --     elements. Free with 'GI.GLib.Functions.strfreev' when no longer needed.
parseContextGetMissingElements :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
ParseContext -> m (Maybe [Text])
parseContextGetMissingElements ParseContext
context = IO (Maybe [Text]) -> m (Maybe [Text])
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (Maybe [Text]) -> m (Maybe [Text]))
-> IO (Maybe [Text]) -> m (Maybe [Text])
forall a b. (a -> b) -> a -> b
$ do
    Ptr ParseContext
context' <- ParseContext -> IO (Ptr ParseContext)
forall a. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr a)
unsafeManagedPtrGetPtr ParseContext
context
    Ptr CString
result <- Ptr ParseContext -> IO (Ptr CString)
gst_parse_context_get_missing_elements Ptr ParseContext
context'
    Maybe [Text]
maybeResult <- Ptr CString -> (Ptr CString -> IO [Text]) -> IO (Maybe [Text])
forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
convertIfNonNull Ptr CString
result ((Ptr CString -> IO [Text]) -> IO (Maybe [Text]))
-> (Ptr CString -> IO [Text]) -> IO (Maybe [Text])
forall a b. (a -> b) -> a -> b
$ \Ptr CString
result' -> do
        [Text]
result'' <- HasCallStack => Ptr CString -> IO [Text]
Ptr CString -> IO [Text]
unpackZeroTerminatedUTF8CArray Ptr CString
result'
        (CString -> IO ()) -> Ptr CString -> IO ()
forall a b. (Ptr a -> IO b) -> Ptr (Ptr a) -> IO ()
mapZeroTerminatedCArray CString -> IO ()
forall a. Ptr a -> IO ()
freeMem Ptr CString
result'
        Ptr CString -> IO ()
forall a. Ptr a -> IO ()
freeMem Ptr CString
result'
        [Text] -> IO [Text]
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return [Text]
result''
    ParseContext -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr ParseContext
context
    Maybe [Text] -> IO (Maybe [Text])
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe [Text]
maybeResult

#if defined(ENABLE_OVERLOADING)
data ParseContextGetMissingElementsMethodInfo
instance (signature ~ (m (Maybe [T.Text])), MonadIO m) => O.OverloadedMethod ParseContextGetMissingElementsMethodInfo ParseContext signature where
    overloadedMethod = parseContextGetMissingElements

instance O.OverloadedMethodInfo ParseContextGetMissingElementsMethodInfo ParseContext where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Gst.Structs.ParseContext.parseContextGetMissingElements",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-gst-1.0.26/docs/GI-Gst-Structs-ParseContext.html#v:parseContextGetMissingElements"
        })


#endif

#if defined(ENABLE_OVERLOADING)
type family ResolveParseContextMethod (t :: Symbol) (o :: *) :: * where
    ResolveParseContextMethod "copy" o = ParseContextCopyMethodInfo
    ResolveParseContextMethod "free" o = ParseContextFreeMethodInfo
    ResolveParseContextMethod "getMissingElements" o = ParseContextGetMissingElementsMethodInfo
    ResolveParseContextMethod l o = O.MethodResolutionFailed l o

instance (info ~ ResolveParseContextMethod t ParseContext, O.OverloadedMethod info ParseContext p) => OL.IsLabel t (ParseContext -> p) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.overloadedMethod @info
#else
    fromLabel _ = O.overloadedMethod @info
#endif

#if MIN_VERSION_base(4,13,0)
instance (info ~ ResolveParseContextMethod t ParseContext, O.OverloadedMethod info ParseContext p, R.HasField t ParseContext p) => R.HasField t ParseContext p where
    getField = O.overloadedMethod @info

#endif

instance (info ~ ResolveParseContextMethod t ParseContext, O.OverloadedMethodInfo info ParseContext) => OL.IsLabel t (O.MethodProxy info ParseContext) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.MethodProxy
#else
    fromLabel _ = O.MethodProxy
#endif

#endif