{-# OPTIONS_GHC -optc-D_WIN32_IE=0x500 #-}
{-# LINE 1 "libraries\\Win32\\System\\Win32\\WindowsString\\Shell.hsc" #-}
{-# LANGUAGE Trustworthy #-}
module System.Win32.WindowsString.Shell (
sHGetFolderPath,
CSIDL,
cSIDL_PROFILE,
cSIDL_APPDATA,
cSIDL_WINDOWS,
cSIDL_PERSONAL,
cSIDL_LOCAL_APPDATA,
cSIDL_DESKTOPDIRECTORY,
cSIDL_PROGRAM_FILES,
SHGetFolderPathFlags,
sHGFP_TYPE_CURRENT,
sHGFP_TYPE_DEFAULT
) where
import System.OsString.Windows (WindowsString)
import System.Win32.Shell.Internal
import System.Win32.Shell hiding (sHGetFolderPath)
import System.Win32.WindowsString.Types
import Graphics.Win32.GDI.Types (HWND)
import Foreign
import Control.Monad
#include "windows_cconv.h"
sHGetFolderPath :: HWND -> CSIDL -> HANDLE -> SHGetFolderPathFlags -> IO WindowsString
sHGetFolderPath hwnd csidl hdl flags =
allocaBytes ((260) * ((1))) $ \pstr -> do
{-# LINE 57 "libraries\\Win32\\System\\Win32\\WindowsString\\Shell.hsc" #-}
r <- c_SHGetFolderPath hwnd csidl hdl flags pstr
when (r < 0) $ raiseUnsupported "sHGetFolderPath"
peekTString pstr