{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.GES.Objects.OperationClip
(
OperationClip(..) ,
IsOperationClip ,
toOperationClip ,
#if defined(ENABLE_OVERLOADING)
ResolveOperationClipMethod ,
#endif
) 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.Kind as DK
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
import {-# SOURCE #-} qualified GI.GES.Interfaces.Extractable as GES.Extractable
import {-# SOURCE #-} qualified GI.GES.Interfaces.MetaContainer as GES.MetaContainer
import {-# SOURCE #-} qualified GI.GES.Objects.Clip as GES.Clip
import {-# SOURCE #-} qualified GI.GES.Objects.Container as GES.Container
import {-# SOURCE #-} qualified GI.GES.Objects.TimelineElement as GES.TimelineElement
import qualified GI.GObject.Objects.Object as GObject.Object
newtype OperationClip = OperationClip (SP.ManagedPtr OperationClip)
deriving (OperationClip -> OperationClip -> Bool
(OperationClip -> OperationClip -> Bool)
-> (OperationClip -> OperationClip -> Bool) -> Eq OperationClip
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: OperationClip -> OperationClip -> Bool
== :: OperationClip -> OperationClip -> Bool
$c/= :: OperationClip -> OperationClip -> Bool
/= :: OperationClip -> OperationClip -> Bool
Eq)
instance SP.ManagedPtrNewtype OperationClip where
toManagedPtr :: OperationClip -> ManagedPtr OperationClip
toManagedPtr (OperationClip ManagedPtr OperationClip
p) = ManagedPtr OperationClip
p
foreign import ccall "ges_operation_clip_get_type"
c_ges_operation_clip_get_type :: IO B.Types.GType
instance B.Types.TypedObject OperationClip where
glibType :: IO GType
glibType = IO GType
c_ges_operation_clip_get_type
instance B.Types.GObject OperationClip
class (SP.GObject o, O.IsDescendantOf OperationClip o) => IsOperationClip o
instance (SP.GObject o, O.IsDescendantOf OperationClip o) => IsOperationClip o
instance O.HasParentTypes OperationClip
type instance O.ParentTypes OperationClip = '[GES.Clip.Clip, GES.Container.Container, GES.TimelineElement.TimelineElement, GObject.Object.Object, GES.Extractable.Extractable, GES.MetaContainer.MetaContainer]
toOperationClip :: (MIO.MonadIO m, IsOperationClip o) => o -> m OperationClip
toOperationClip :: forall (m :: * -> *) o.
(MonadIO m, IsOperationClip o) =>
o -> m OperationClip
toOperationClip = IO OperationClip -> m OperationClip
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO OperationClip -> m OperationClip)
-> (o -> IO OperationClip) -> o -> m OperationClip
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr OperationClip -> OperationClip)
-> o -> IO OperationClip
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr OperationClip -> OperationClip
OperationClip
instance B.GValue.IsGValue (Maybe OperationClip) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_ges_operation_clip_get_type
gvalueSet_ :: Ptr GValue -> Maybe OperationClip -> IO ()
gvalueSet_ Ptr GValue
gv Maybe OperationClip
P.Nothing = Ptr GValue -> Ptr OperationClip -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr OperationClip
forall a. Ptr a
FP.nullPtr :: FP.Ptr OperationClip)
gvalueSet_ Ptr GValue
gv (P.Just OperationClip
obj) = OperationClip -> (Ptr OperationClip -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr OperationClip
obj (Ptr GValue -> Ptr OperationClip -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe OperationClip)
gvalueGet_ Ptr GValue
gv = do
Ptr OperationClip
ptr <- Ptr GValue -> IO (Ptr OperationClip)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr OperationClip)
if Ptr OperationClip
ptr Ptr OperationClip -> Ptr OperationClip -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr OperationClip
forall a. Ptr a
FP.nullPtr
then OperationClip -> Maybe OperationClip
forall a. a -> Maybe a
P.Just (OperationClip -> Maybe OperationClip)
-> IO OperationClip -> IO (Maybe OperationClip)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr OperationClip -> OperationClip)
-> Ptr OperationClip -> IO OperationClip
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr OperationClip -> OperationClip
OperationClip Ptr OperationClip
ptr
else Maybe OperationClip -> IO (Maybe OperationClip)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe OperationClip
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolveOperationClipMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveOperationClipMethod "add" o = GES.Container.ContainerAddMethodInfo
ResolveOperationClipMethod "addAsset" o = GES.Clip.ClipAddAssetMethodInfo
ResolveOperationClipMethod "addChildProperty" o = GES.TimelineElement.TimelineElementAddChildPropertyMethodInfo
ResolveOperationClipMethod "addChildToTrack" o = GES.Clip.ClipAddChildToTrackMethodInfo
ResolveOperationClipMethod "addMetasFromString" o = GES.MetaContainer.MetaContainerAddMetasFromStringMethodInfo
ResolveOperationClipMethod "addTopEffect" o = GES.Clip.ClipAddTopEffectMethodInfo
ResolveOperationClipMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveOperationClipMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveOperationClipMethod "checkMetaRegistered" o = GES.MetaContainer.MetaContainerCheckMetaRegisteredMethodInfo
ResolveOperationClipMethod "copy" o = GES.TimelineElement.TimelineElementCopyMethodInfo
ResolveOperationClipMethod "edit" o = GES.Container.ContainerEditMethodInfo
ResolveOperationClipMethod "editFull" o = GES.TimelineElement.TimelineElementEditFullMethodInfo
ResolveOperationClipMethod "findTrackElement" o = GES.Clip.ClipFindTrackElementMethodInfo
ResolveOperationClipMethod "findTrackElements" o = GES.Clip.ClipFindTrackElementsMethodInfo
ResolveOperationClipMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveOperationClipMethod "foreach" o = GES.MetaContainer.MetaContainerForeachMethodInfo
ResolveOperationClipMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveOperationClipMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveOperationClipMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveOperationClipMethod "listChildrenProperties" o = GES.TimelineElement.TimelineElementListChildrenPropertiesMethodInfo
ResolveOperationClipMethod "lookupChild" o = GES.TimelineElement.TimelineElementLookupChildMethodInfo
ResolveOperationClipMethod "metasToString" o = GES.MetaContainer.MetaContainerMetasToStringMethodInfo
ResolveOperationClipMethod "moveToLayer" o = GES.Clip.ClipMoveToLayerMethodInfo
ResolveOperationClipMethod "moveToLayerFull" o = GES.Clip.ClipMoveToLayerFullMethodInfo
ResolveOperationClipMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveOperationClipMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveOperationClipMethod "paste" o = GES.TimelineElement.TimelineElementPasteMethodInfo
ResolveOperationClipMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveOperationClipMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveOperationClipMethod "registerMeta" o = GES.MetaContainer.MetaContainerRegisterMetaMethodInfo
ResolveOperationClipMethod "registerMetaBoolean" o = GES.MetaContainer.MetaContainerRegisterMetaBooleanMethodInfo
ResolveOperationClipMethod "registerMetaDate" o = GES.MetaContainer.MetaContainerRegisterMetaDateMethodInfo
ResolveOperationClipMethod "registerMetaDateTime" o = GES.MetaContainer.MetaContainerRegisterMetaDateTimeMethodInfo
ResolveOperationClipMethod "registerMetaDouble" o = GES.MetaContainer.MetaContainerRegisterMetaDoubleMethodInfo
ResolveOperationClipMethod "registerMetaFloat" o = GES.MetaContainer.MetaContainerRegisterMetaFloatMethodInfo
ResolveOperationClipMethod "registerMetaInt" o = GES.MetaContainer.MetaContainerRegisterMetaIntMethodInfo
ResolveOperationClipMethod "registerMetaInt64" o = GES.MetaContainer.MetaContainerRegisterMetaInt64MethodInfo
ResolveOperationClipMethod "registerMetaString" o = GES.MetaContainer.MetaContainerRegisterMetaStringMethodInfo
ResolveOperationClipMethod "registerMetaUint" o = GES.MetaContainer.MetaContainerRegisterMetaUintMethodInfo
ResolveOperationClipMethod "registerMetaUint64" o = GES.MetaContainer.MetaContainerRegisterMetaUint64MethodInfo
ResolveOperationClipMethod "registerStaticMeta" o = GES.MetaContainer.MetaContainerRegisterStaticMetaMethodInfo
ResolveOperationClipMethod "remove" o = GES.Container.ContainerRemoveMethodInfo
ResolveOperationClipMethod "removeChildProperty" o = GES.TimelineElement.TimelineElementRemoveChildPropertyMethodInfo
ResolveOperationClipMethod "removeTopEffect" o = GES.Clip.ClipRemoveTopEffectMethodInfo
ResolveOperationClipMethod "ripple" o = GES.TimelineElement.TimelineElementRippleMethodInfo
ResolveOperationClipMethod "rippleEnd" o = GES.TimelineElement.TimelineElementRippleEndMethodInfo
ResolveOperationClipMethod "rollEnd" o = GES.TimelineElement.TimelineElementRollEndMethodInfo
ResolveOperationClipMethod "rollStart" o = GES.TimelineElement.TimelineElementRollStartMethodInfo
ResolveOperationClipMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveOperationClipMethod "split" o = GES.Clip.ClipSplitMethodInfo
ResolveOperationClipMethod "splitFull" o = GES.Clip.ClipSplitFullMethodInfo
ResolveOperationClipMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveOperationClipMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveOperationClipMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveOperationClipMethod "trim" o = GES.TimelineElement.TimelineElementTrimMethodInfo
ResolveOperationClipMethod "ungroup" o = GES.Container.ContainerUngroupMethodInfo
ResolveOperationClipMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveOperationClipMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveOperationClipMethod "getAsset" o = GES.Extractable.ExtractableGetAssetMethodInfo
ResolveOperationClipMethod "getBoolean" o = GES.MetaContainer.MetaContainerGetBooleanMethodInfo
ResolveOperationClipMethod "getChildProperty" o = GES.TimelineElement.TimelineElementGetChildPropertyMethodInfo
ResolveOperationClipMethod "getChildPropertyByPspec" o = GES.TimelineElement.TimelineElementGetChildPropertyByPspecMethodInfo
ResolveOperationClipMethod "getChildren" o = GES.Container.ContainerGetChildrenMethodInfo
ResolveOperationClipMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveOperationClipMethod "getDate" o = GES.MetaContainer.MetaContainerGetDateMethodInfo
ResolveOperationClipMethod "getDateTime" o = GES.MetaContainer.MetaContainerGetDateTimeMethodInfo
ResolveOperationClipMethod "getDouble" o = GES.MetaContainer.MetaContainerGetDoubleMethodInfo
ResolveOperationClipMethod "getDuration" o = GES.TimelineElement.TimelineElementGetDurationMethodInfo
ResolveOperationClipMethod "getDurationLimit" o = GES.Clip.ClipGetDurationLimitMethodInfo
ResolveOperationClipMethod "getFloat" o = GES.MetaContainer.MetaContainerGetFloatMethodInfo
ResolveOperationClipMethod "getId" o = GES.Extractable.ExtractableGetIdMethodInfo
ResolveOperationClipMethod "getInpoint" o = GES.TimelineElement.TimelineElementGetInpointMethodInfo
ResolveOperationClipMethod "getInt" o = GES.MetaContainer.MetaContainerGetIntMethodInfo
ResolveOperationClipMethod "getInt64" o = GES.MetaContainer.MetaContainerGetInt64MethodInfo
ResolveOperationClipMethod "getInternalTimeFromTimelineTime" o = GES.Clip.ClipGetInternalTimeFromTimelineTimeMethodInfo
ResolveOperationClipMethod "getLayer" o = GES.Clip.ClipGetLayerMethodInfo
ResolveOperationClipMethod "getLayerPriority" o = GES.TimelineElement.TimelineElementGetLayerPriorityMethodInfo
ResolveOperationClipMethod "getMarkerList" o = GES.MetaContainer.MetaContainerGetMarkerListMethodInfo
ResolveOperationClipMethod "getMaxDuration" o = GES.TimelineElement.TimelineElementGetMaxDurationMethodInfo
ResolveOperationClipMethod "getMeta" o = GES.MetaContainer.MetaContainerGetMetaMethodInfo
ResolveOperationClipMethod "getName" o = GES.TimelineElement.TimelineElementGetNameMethodInfo
ResolveOperationClipMethod "getNaturalFramerate" o = GES.TimelineElement.TimelineElementGetNaturalFramerateMethodInfo
ResolveOperationClipMethod "getParent" o = GES.TimelineElement.TimelineElementGetParentMethodInfo
ResolveOperationClipMethod "getPriority" o = GES.TimelineElement.TimelineElementGetPriorityMethodInfo
ResolveOperationClipMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveOperationClipMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveOperationClipMethod "getStart" o = GES.TimelineElement.TimelineElementGetStartMethodInfo
ResolveOperationClipMethod "getString" o = GES.MetaContainer.MetaContainerGetStringMethodInfo
ResolveOperationClipMethod "getSupportedFormats" o = GES.Clip.ClipGetSupportedFormatsMethodInfo
ResolveOperationClipMethod "getTimeline" o = GES.TimelineElement.TimelineElementGetTimelineMethodInfo
ResolveOperationClipMethod "getTimelineTimeFromInternalTime" o = GES.Clip.ClipGetTimelineTimeFromInternalTimeMethodInfo
ResolveOperationClipMethod "getTimelineTimeFromSourceFrame" o = GES.Clip.ClipGetTimelineTimeFromSourceFrameMethodInfo
ResolveOperationClipMethod "getTopEffectIndex" o = GES.Clip.ClipGetTopEffectIndexMethodInfo
ResolveOperationClipMethod "getTopEffectPosition" o = GES.Clip.ClipGetTopEffectPositionMethodInfo
ResolveOperationClipMethod "getTopEffects" o = GES.Clip.ClipGetTopEffectsMethodInfo
ResolveOperationClipMethod "getToplevelParent" o = GES.TimelineElement.TimelineElementGetToplevelParentMethodInfo
ResolveOperationClipMethod "getTrackTypes" o = GES.TimelineElement.TimelineElementGetTrackTypesMethodInfo
ResolveOperationClipMethod "getUint" o = GES.MetaContainer.MetaContainerGetUintMethodInfo
ResolveOperationClipMethod "getUint64" o = GES.MetaContainer.MetaContainerGetUint64MethodInfo
ResolveOperationClipMethod "setAsset" o = GES.Extractable.ExtractableSetAssetMethodInfo
ResolveOperationClipMethod "setBoolean" o = GES.MetaContainer.MetaContainerSetBooleanMethodInfo
ResolveOperationClipMethod "setChildProperty" o = GES.TimelineElement.TimelineElementSetChildPropertyMethodInfo
ResolveOperationClipMethod "setChildPropertyByPspec" o = GES.TimelineElement.TimelineElementSetChildPropertyByPspecMethodInfo
ResolveOperationClipMethod "setChildPropertyFull" o = GES.TimelineElement.TimelineElementSetChildPropertyFullMethodInfo
ResolveOperationClipMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveOperationClipMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveOperationClipMethod "setDate" o = GES.MetaContainer.MetaContainerSetDateMethodInfo
ResolveOperationClipMethod "setDateTime" o = GES.MetaContainer.MetaContainerSetDateTimeMethodInfo
ResolveOperationClipMethod "setDouble" o = GES.MetaContainer.MetaContainerSetDoubleMethodInfo
ResolveOperationClipMethod "setDuration" o = GES.TimelineElement.TimelineElementSetDurationMethodInfo
ResolveOperationClipMethod "setFloat" o = GES.MetaContainer.MetaContainerSetFloatMethodInfo
ResolveOperationClipMethod "setInpoint" o = GES.TimelineElement.TimelineElementSetInpointMethodInfo
ResolveOperationClipMethod "setInt" o = GES.MetaContainer.MetaContainerSetIntMethodInfo
ResolveOperationClipMethod "setInt64" o = GES.MetaContainer.MetaContainerSetInt64MethodInfo
ResolveOperationClipMethod "setMarkerList" o = GES.MetaContainer.MetaContainerSetMarkerListMethodInfo
ResolveOperationClipMethod "setMaxDuration" o = GES.TimelineElement.TimelineElementSetMaxDurationMethodInfo
ResolveOperationClipMethod "setMeta" o = GES.MetaContainer.MetaContainerSetMetaMethodInfo
ResolveOperationClipMethod "setName" o = GES.TimelineElement.TimelineElementSetNameMethodInfo
ResolveOperationClipMethod "setParent" o = GES.TimelineElement.TimelineElementSetParentMethodInfo
ResolveOperationClipMethod "setPriority" o = GES.TimelineElement.TimelineElementSetPriorityMethodInfo
ResolveOperationClipMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveOperationClipMethod "setStart" o = GES.TimelineElement.TimelineElementSetStartMethodInfo
ResolveOperationClipMethod "setString" o = GES.MetaContainer.MetaContainerSetStringMethodInfo
ResolveOperationClipMethod "setSupportedFormats" o = GES.Clip.ClipSetSupportedFormatsMethodInfo
ResolveOperationClipMethod "setTimeline" o = GES.TimelineElement.TimelineElementSetTimelineMethodInfo
ResolveOperationClipMethod "setTopEffectIndex" o = GES.Clip.ClipSetTopEffectIndexMethodInfo
ResolveOperationClipMethod "setTopEffectIndexFull" o = GES.Clip.ClipSetTopEffectIndexFullMethodInfo
ResolveOperationClipMethod "setTopEffectPriority" o = GES.Clip.ClipSetTopEffectPriorityMethodInfo
ResolveOperationClipMethod "setUint" o = GES.MetaContainer.MetaContainerSetUintMethodInfo
ResolveOperationClipMethod "setUint64" o = GES.MetaContainer.MetaContainerSetUint64MethodInfo
ResolveOperationClipMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveOperationClipMethod t OperationClip, O.OverloadedMethod info OperationClip p) => OL.IsLabel t (OperationClip -> 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 ~ ResolveOperationClipMethod t OperationClip, O.OverloadedMethod info OperationClip p, R.HasField t OperationClip p) => R.HasField t OperationClip p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveOperationClipMethod t OperationClip, O.OverloadedMethodInfo info OperationClip) => OL.IsLabel t (O.MethodProxy info OperationClip) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList OperationClip
type instance O.AttributeList OperationClip = OperationClipAttributeList
type OperationClipAttributeList = ('[ '("duration", GES.TimelineElement.TimelineElementDurationPropertyInfo), '("durationLimit", GES.Clip.ClipDurationLimitPropertyInfo), '("height", GES.Container.ContainerHeightPropertyInfo), '("inPoint", GES.TimelineElement.TimelineElementInPointPropertyInfo), '("layer", GES.Clip.ClipLayerPropertyInfo), '("maxDuration", GES.TimelineElement.TimelineElementMaxDurationPropertyInfo), '("name", GES.TimelineElement.TimelineElementNamePropertyInfo), '("parent", GES.TimelineElement.TimelineElementParentPropertyInfo), '("priority", GES.TimelineElement.TimelineElementPriorityPropertyInfo), '("serialize", GES.TimelineElement.TimelineElementSerializePropertyInfo), '("start", GES.TimelineElement.TimelineElementStartPropertyInfo), '("supportedFormats", GES.Clip.ClipSupportedFormatsPropertyInfo), '("timeline", GES.TimelineElement.TimelineElementTimelinePropertyInfo)] :: [(Symbol, DK.Type)])
#endif
#if defined(ENABLE_OVERLOADING)
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList OperationClip = OperationClipSignalList
type OperationClipSignalList = ('[ '("childAdded", GES.Container.ContainerChildAddedSignalInfo), '("childPropertyAdded", GES.TimelineElement.TimelineElementChildPropertyAddedSignalInfo), '("childPropertyRemoved", GES.TimelineElement.TimelineElementChildPropertyRemovedSignalInfo), '("childRemoved", GES.Container.ContainerChildRemovedSignalInfo), '("deepNotify", GES.TimelineElement.TimelineElementDeepNotifySignalInfo), '("notify", GObject.Object.ObjectNotifySignalInfo), '("notifyMeta", GES.MetaContainer.MetaContainerNotifyMetaSignalInfo)] :: [(Symbol, DK.Type)])
#endif