{-# OPTIONS_GHC -optc-D_WIN32_IE=0x500 #-}
{-# LINE 1 "System\\Win32\\Shell\\Internal.hsc" #-}
{-# LINE 2 "System\\Win32\\Shell\\Internal.hsc" #-}
{-# LANGUAGE Safe #-}
{-# LINE 6 "System\\Win32\\Shell\\Internal.hsc" #-}
module System.Win32.Shell.Internal (
c_SHGetFolderPath
, raiseUnsupported
) where
import System.Win32.Types
import Graphics.Win32.GDI.Types (HWND)
import Foreign.C
import System.IO.Error
#include "windows_cconv.h"
raiseUnsupported :: String -> IO ()
raiseUnsupported loc =
ioError (ioeSetErrorString (mkIOError illegalOperationErrorType loc Nothing Nothing) "unsupported operation")
foreign import WINDOWS_CCONV unsafe "SHGetFolderPathW"
c_SHGetFolderPath :: HWND -> CInt -> HANDLE -> DWORD -> LPTSTR
-> IO HRESULT