fltkhs-0.5.1.4: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.NativeFileChooser

Contents

Synopsis

Documentation

data NativeFileChooserType Source #

data NativeFileChooserOption Source #

Instances

Enum NativeFileChooserOption Source # 
Eq NativeFileChooserOption Source # 
Ord NativeFileChooserOption Source # 
Show NativeFileChooserOption Source # 

Constructor

Hierarchy

Native_File_Chooser

destroy :: Ref NativeFileChooser -> IO ()

filters :: Ref NativeFileChooser -> IO (Int)

getCount :: Ref NativeFileChooser -> IO (Int)

getDirectory :: Ref NativeFileChooser -> IO (Maybe Text)

getErrmsg :: Ref NativeFileChooser -> IO (Maybe Text)

getFilename :: Ref NativeFileChooser -> IO (Maybe Text)

getFilenameAt :: Ref NativeFileChooser -> Int -> IO (Maybe Text)

getFilter :: Ref NativeFileChooser -> IO (Maybe Text)

getFilterValue :: Ref NativeFileChooser -> IO (Int)

getOptions :: Ref NativeFileChooser -> IO ([NativeFileChooserOption)]

getPresetFile :: Ref NativeFileChooser -> IO (Maybe Text)

getTitle :: Ref NativeFileChooser -> IO (Maybe Text)

getType_ :: Ref NativeFileChooser -> IO (NativeFileChooserType)

setDirectory :: Ref NativeFileChooser -> Text -> IO ()

setFilter :: Ref NativeFileChooser -> Text -> IO ()

setFilterValue :: Ref NativeFileChooser -> Int -> IO ()

setOptions :: Ref NativeFileChooser -> [NativeFileChooserOption] -> IO ()

setPresetFile :: Ref NativeFileChooser -> Text -> IO ()

setTitle :: Ref NativeFileChooser -> Text -> IO ()

setType :: Ref NativeFileChooser -> NativeFileChooserType -> IO ()

showWidget :: Ref NativeFileChooser -> IO (NativeFileChooserUserAction)

Orphan instances

(~) * impl (IO (Maybe Text)) => Op (GetErrmsg ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetErrmsg () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO (Maybe Text)) => Op (GetPresetFile ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetPresetFile () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Text -> IO ()) => Op (SetPresetFile ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetPresetFile () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO Int) => Op (GetFilterValue ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetFilterValue () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Int -> IO ()) => Op (SetFilterValue ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetFilterValue () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO Int) => Op (Filters ()) NativeFileChooser orig impl Source # 

Methods

runOp :: Filters () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Text -> IO ()) => Op (SetFilter ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetFilter () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO (Maybe Text)) => Op (GetFilter ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetFilter () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO (Maybe Text)) => Op (GetTitle ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetTitle () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Text -> IO ()) => Op (SetTitle ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetTitle () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO (Maybe Text)) => Op (GetDirectory ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetDirectory () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Text -> IO ()) => Op (SetDirectory ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetDirectory () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (Int -> IO (Maybe Text)) => Op (GetFilenameAt ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetFilenameAt () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO (Maybe Text)) => Op (GetFilename ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetFilename () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO [NativeFileChooserOption]) => Op (GetOptions ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetOptions () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl ([NativeFileChooserOption] -> IO ()) => Op (SetOptions ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetOptions () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO Int) => Op (GetCount ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetCount () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO NativeFileChooserUserAction) => Op (ShowWidget ()) NativeFileChooser orig impl Source # 

Methods

runOp :: ShowWidget () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (NativeFileChooserType -> IO ()) => Op (SetType ()) NativeFileChooser orig impl Source # 

Methods

runOp :: SetType () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO NativeFileChooserType) => Op (GetType_ ()) NativeFileChooser orig impl Source # 

Methods

runOp :: GetType_ () -> orig -> Ref NativeFileChooser -> impl Source #

(~) * impl (IO ()) => Op (Destroy ()) NativeFileChooser orig impl Source # 

Methods

runOp :: Destroy () -> orig -> Ref NativeFileChooser -> impl Source #