{-# LANGUAGE ImportQualifiedPost #-}
{-# OPTIONS_GHC -Wall -fno-warn-tabs #-}

module Graphics.UI.GlfwG.Mouse (

	getButton, B.MouseButton(..), B.MouseButtonState(..),
	getCursorPos

	) where

import Graphics.UI.GLFW qualified as B
import Graphics.UI.GlfwG.Window.Type qualified as Win

getButton :: Win.W sw -> B.MouseButton -> IO B.MouseButtonState
getButton :: forall sw. W sw -> MouseButton -> IO MouseButtonState
getButton (Win.W Window
w) = Window -> MouseButton -> IO MouseButtonState
B.getMouseButton Window
w

getCursorPos :: Win.W sw -> IO (Double, Double)
getCursorPos :: forall sw. W sw -> IO (Double, Double)
getCursorPos (Win.W Window
w) = Window -> IO (Double, Double)
B.getCursorPos Window
w