cut-the-crap-2.3.0: Cuts out uninteresting parts of videos by detecting silences.
Safe HaskellNone
LanguageHaskell2010

Cut.Options

Description

This module defines which options exists, and provides functions for parsing cli options.

Synopsis

Documentation

Program options

data ProgramOptions a Source #

Instances

Instances details
Show a => Show (ProgramOptions a) Source # 
Instance details

Defined in Cut.Options

Generic (ProgramOptions a) Source # 
Instance details

Defined in Cut.Options

Associated Types

type Rep (ProgramOptions a) :: Type -> Type #

type Rep (ProgramOptions a) Source # 
Instance details

Defined in Cut.Options

type Rep (ProgramOptions a) = D1 ('MetaData "ProgramOptions" "Cut.Options" "cut-the-crap-2.3.0-inplace" 'False) (C1 ('MetaCons "ListenCut" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ListenCutOptionsT a))) :+: C1 ('MetaCons "GenerateSubtitles" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FileIO a))))

fileio, deal with input output files

data FileIO a Source #

Deals with having an input file and a target output file

Instances

Instances details
Show a => Show (FileIO a) Source # 
Instance details

Defined in Cut.Options

Methods

showsPrec :: Int -> FileIO a -> ShowS #

show :: FileIO a -> String #

showList :: [FileIO a] -> ShowS #

Generic (FileIO a) Source # 
Instance details

Defined in Cut.Options

Associated Types

type Rep (FileIO a) :: Type -> Type #

Methods

from :: FileIO a -> Rep (FileIO a) x #

to :: Rep (FileIO a) x -> FileIO a #

type Rep (FileIO a) Source # 
Instance details

Defined in Cut.Options

type Rep (FileIO a) = D1 ('MetaData "FileIO" "Cut.Options" "cut-the-crap-2.3.0-inplace" 'False) (C1 ('MetaCons "FileIO" 'PrefixI 'True) (S1 ('MetaSel ('Just "fi_inFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "fi_outFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "fi_workDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)))))

in_file :: Lens (FileIO a) (FileIO b) a b Source #

listen cut, options for video editing by audio

data ListenCutOptionsT a Source #

Cut out by listening to sound options

Instances

Instances details
Show a => Show (ListenCutOptionsT a) Source # 
Instance details

Defined in Cut.Options

Generic (ListenCutOptionsT a) Source # 
Instance details

Defined in Cut.Options

Associated Types

type Rep (ListenCutOptionsT a) :: Type -> Type #

type Rep (ListenCutOptionsT a) Source # 
Instance details

Defined in Cut.Options

type Rep (ListenCutOptionsT a) = D1 ('MetaData "ListenCutOptionsT" "Cut.Options" "cut-the-crap-2.3.0-inplace" 'False) (C1 ('MetaCons "ListenCutOptions" 'PrefixI 'True) ((S1 ('MetaSel ('Just "lc_fileIO") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FileIO a)) :*: (S1 ('MetaSel ('Just "lc_silentTreshold") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)) :*: S1 ('MetaSel ('Just "lc_silentDuration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)))) :*: ((S1 ('MetaSel ('Just "lc_detectMargin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)) :*: S1 ('MetaSel ('Just "lc_voiceTrack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "lc_musicTrack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "lc_cutNoise") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))

input source prisms

data InputSource Source #

Instances

Instances details
Show InputSource Source # 
Instance details

Defined in Cut.Options

Generic InputSource Source # 
Instance details

Defined in Cut.Options

Associated Types

type Rep InputSource :: Type -> Type #

type Rep InputSource Source # 
Instance details

Defined in Cut.Options

type Rep InputSource = D1 ('MetaData "InputSource" "Cut.Options" "cut-the-crap-2.3.0-inplace" 'False) (C1 ('MetaCons "LocalFile" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "Remote" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URI)))

defaults